Introduction

For this project, the focus was on gaining continued familiarity with the process of taking untidy data and doing the necessary pre-processing work to convert the data to tidy data. Additionally, we focused on demonstrating our analysis skills on the data, as well as the process of importing data into R and exporting the cleaned up data.

For this project, I chose the following three datasets that were shared to the class by the following students: (a) Coco Donovan - https://raw.githubusercontent.com/rodrigomf5/Tidydata/master/relinc.csv (b) Alice Ding - https://raw.githubusercontent.com/klmartin1998/cuny_datascience/main/DATA%20607/input/project2_student_data.csv (c) Kory Martin - https://raw.githubusercontent.com/klmartin1998/cuny_datascience/main/DATA%20607/input/unclean_aatherapist_info.csv

Below, I will demonstrate the work done to import the raw untidy data and then demonstrate the work done to clean the data that will ultimately be used to perform various analysis steps.

Setup

We begin the process by loading the libraries that will be used for this project.

Dataset 1

Import and clean data

For this step, we begin by importing the data from a .csv file that is located in GitHub, and then begin doing the work to clean the tidy. The main steps we will take include:

  1. Import the data into a dataframe
  2. Update column names
  3. Convert data from wide to long, by creating a new column labeled “income” and then reassigning the current column values to a new column labeled “num_respondents”
ds1 = 'https://raw.githubusercontent.com/rodrigomf5/Tidydata/master/relinc.csv'

df1_parta = read.csv(ds1)

#Initial Data
df1_parta
##                   religion X.10k X10.20k X20.30k X30.40k X40.50k X50.75k
## 1                 Agnostic    27      34      60      81      76     137
## 2                  Atheist    12      27      37      52      35      70
## 3                 Buddhist    27      21      30      34      33      58
## 4                 Catholic   418     617     732     670     638    1116
## 5                  refused    15      14      15      11      10      35
## 6         Evangelical Prot   575     869    1064     982     881    1486
## 7                    Hindu     1       9       7       9      11      34
## 8  Historically Black Prot   228     244     236     238     197     223
## 9        Jehovah's Witness    20      27      24      24      21      30
## 10                  Jewish    19      19      25      25      30      95
## 11           Mainline Prot   289     495     619     655     651    1107
## 12                  Mormon    29      40      48      51      56     112
## 13                  Muslim     6       7       9      10       9      23
## 14                Orthodox    13      17      23      32      32      47
## 15         Other Christian     9       7      11      13      13      14
## 16            Other Faiths    20      33      40      46      49      63
## 17   Other World Religions     5       2       3       4       2       7
## 18            Unaffiliated   217     299     374     365     341     528
##    X75.100k X100.150k X.150k refused
## 1       122       109     84      96
## 2        73        59     74      76
## 3        62        39     53      54
## 4       949       792    633    1489
## 5        21        17     18     116
## 6       949       723    414    1529
## 7        47        48     54      37
## 8       131        81     78     339
## 9        15        11      6      37
## 10       69        87    151     162
## 11      939       753    634    1328
## 12       85        49     42      69
## 13       16         8      6      22
## 14       38        42     46      73
## 15       18        14     12      18
## 16       46        40     41      71
## 17        3         4      4       8
## 18      407       321    258     597
columns = colnames(df1_parta)
columns
##  [1] "religion"  "X.10k"     "X10.20k"   "X20.30k"   "X30.40k"   "X40.50k"  
##  [7] "X50.75k"   "X75.100k"  "X100.150k" "X.150k"    "refused"
df2_parta <- 
  df1_parta %>%
  rename('under_10k' = columns[2],
         '10k_to_20k' = columns[3],
         '20k_to_30k' = columns[4],
         '30k_to_40k' = columns[5],
         '40k_to_50k' = columns[6],
         '50k_to_70k' = columns[7],
         '75k_to_100k' = columns[8],
         '100k_to_150k' = columns[9],
         'over_150k' = columns[10])

df3_parta <- 
  df2_parta %>% 
  pivot_longer(!religion, names_to = "income", values_to = "num_respondents")

#Cleaned Data
df3_parta
## # A tibble: 180 × 3
##    religion income       num_respondents
##    <chr>    <chr>                  <int>
##  1 Agnostic under_10k                 27
##  2 Agnostic 10k_to_20k                34
##  3 Agnostic 20k_to_30k                60
##  4 Agnostic 30k_to_40k                81
##  5 Agnostic 40k_to_50k                76
##  6 Agnostic 50k_to_70k               137
##  7 Agnostic 75k_to_100k              122
##  8 Agnostic 100k_to_150k             109
##  9 Agnostic over_150k                 84
## 10 Agnostic refused                   96
## # … with 170 more rows
#Output dataframe as .csv file
write_csv(df3_parta, "../output/relinc_tidy.csv")

Analyze Dataset

For this dataset, we performed analyses steps to answer the following questions:

  1. What is the breakdown of all respondents by religious group?
  2. Which religious group has the wealthiest followers?
  3. How do the income breakdowns compare for each religious group?
  4. What percent of respondents refused to report their income per group?
  5. What was the maximum income group for each religion?

Answers: (1) See chart below (2) When only including the actual respondents to the survey, the top 3 religious groups having the wealthiest followers were Jewish, with 29% of respondents having income over $150K; Hindu, with 25% of respondents having income over $150k; and Athiest, with 17% of respondents reporting having income over $150k. (3) See table below (4) See chart below (5) See table below

df1 <- df3_parta

#(1) What is the religious group makeup of all respondents?
df1 %>%
  group_by(religion) %>%
  summarize(total_respondents = sum(num_respondents)) %>%
  mutate(pct_total = total_respondents/sum(total_respondents)) %>%
  arrange(desc(pct_total)) %>%
  mutate(religion = factor(religion, levels=religion)) %>% 
  ggplot(aes(x=religion, y=pct_total)) +
  geom_bar(aes(x=religion, y=pct_total, fill=religion), stat='identity') +
  theme(axis.text.x = element_text(angle=90)) +
  scale_y_continuous(labels = scales::percent) +
  labs(title = "Percent of Total Respondents by Religion", 
       x = "Religion", 
       y = "\n Percent of Total Respondents") +
  geom_text(aes(label = paste0(format(pct_total*100,digits=0),"%")))

#(2) Which religious group has the wealthiest followers?
df1 %>% 
  filter(income != 'refused') %>% 
  group_by(religion) %>%
  mutate(group_size = sum(num_respondents),
         pct_group = num_respondents/group_size) %>%
  filter(pct_group == max(pct_group),income == 'over_150k') %>%
  arrange(pct_group) %>%
  mutate(religion = factor(religion, levels=religion)) %>%
  ggplot(aes(x=religion, y=pct_group)) +
  geom_bar(aes(fill=religion), stat='identity') +
  labs(title = "\n Top 3 Religious Groups by Followers Income", 
       subtitle = "Pct of Followers having income over $150K",
       x = "\n Religion",
       y="\n Pct of Groups Respondents") +
  scale_y_continuous(labels = scales::percent)

#(3) How do the income breakdowns compare for each religious group?
(df1 %>% 
  filter(income != 'refused') %>% 
  mutate(income = factor(income, levels=unique(df1$income))) %>%  
  group_by(religion) %>%
  mutate(group_size = sum(num_respondents),
         pct_group = num_respondents/group_size) %>%
  select(religion, income, pct_group) %>%
  mutate(pct_group = paste0(format(pct_group*100,digits=2),"%")) %>%
  spread(key=income, value=pct_group))
## # A tibble: 18 × 10
## # Groups:   religion [18]
##    religion      under…¹ 10k_t…² 20k_t…³ 30k_t…⁴ 40k_t…⁵ 50k_t…⁶ 75k_t…⁷ 100k_…⁸
##    <chr>         <chr>   <chr>   <chr>   <chr>   <chr>   <chr>   <chr>   <chr>  
##  1 Agnostic      " 3.7%" " 4.7%" " 8.2%" "11.1%" "10.4%" 18.8%   "16.7%" "14.9%"
##  2 Atheist       " 2.7%" " 6.2%" " 8.4%" "11.8%" " 8.0%" 15.9%   "16.6%" "13.4%"
##  3 Buddhist      " 7.6%" " 5.9%" " 8.4%" " 9.5%" " 9.2%" 16.2%   "17.4%" "10.9%"
##  4 Catholic      " 6.4%" " 9.4%" "11.2%" "10.2%" " 9.7%" 17.0%   "14.5%" "12.1%"
##  5 Evangelical … " 7.2%" "10.9%" "13.4%" "12.4%" "11.1%" 18.7%   "11.9%" " 9.1%"
##  6 Hindu         " 0.45… " 4.09… " 3.18… " 4.09… " 5.00… 15.45%  "21.36… "21.82…
##  7 Historically… "13.8%" "14.7%" "14.3%" "14.4%" "11.9%" 13.5%   " 7.9%" " 4.9%"
##  8 Jehovah's Wi… "11.2%" "15.2%" "13.5%" "13.5%" "11.8%" 16.9%   " 8.4%" " 6.2%"
##  9 Jewish        " 3.7%" " 3.7%" " 4.8%" " 4.8%" " 5.8%" 18.3%   "13.3%" "16.7%"
## 10 Mainline Prot " 4.7%" " 8.1%" "10.1%" "10.7%" "10.6%" 18.0%   "15.3%" "12.3%"
## 11 Mormon        " 5.7%" " 7.8%" " 9.4%" "10.0%" "10.9%" 21.9%   "16.6%" " 9.6%"
## 12 Muslim        " 6.4%" " 7.4%" " 9.6%" "10.6%" " 9.6%" 24.5%   "17.0%" " 8.5%"
## 13 Orthodox      " 4.5%" " 5.9%" " 7.9%" "11.0%" "11.0%" 16.2%   "13.1%" "14.5%"
## 14 Other Christ… " 8.1%" " 6.3%" " 9.9%" "11.7%" "11.7%" 12.6%   "16.2%" "12.6%"
## 15 Other Faiths  " 5.3%" " 8.7%" "10.6%" "12.2%" "13.0%" 16.7%   "12.2%" "10.6%"
## 16 Other World … "14.7%" " 5.9%" " 8.8%" "11.8%" " 5.9%" 20.6%   " 8.8%" "11.8%"
## 17 refused       " 9.6%" " 9.0%" " 9.6%" " 7.1%" " 6.4%" 22.4%   "13.5%" "10.9%"
## 18 Unaffiliated  " 7.0%" " 9.6%" "12.0%" "11.7%" "11.0%" 17.0%   "13.1%" "10.3%"
## # … with 1 more variable: over_150k <chr>, and abbreviated variable names
## #   ¹​under_10k, ²​`10k_to_20k`, ³​`20k_to_30k`, ⁴​`30k_to_40k`, ⁵​`40k_to_50k`,
## #   ⁶​`50k_to_70k`, ⁷​`75k_to_100k`, ⁸​`100k_to_150k`
df1 %>% 
  filter(income != 'refused') %>% 
  mutate(income = factor(income, levels=unique(df1$income))) %>%  
  group_by(religion) %>%
  mutate(group_size = sum(num_respondents),
         pct_group = num_respondents/group_size) %>%
  group_by(religion) %>%
  arrange(income) %>%
  ggplot(aes(x=religion, y=pct_group)) +
  geom_bar(aes(x=religion, y=pct_group, fill=income), position='stack', stat='identity') +
  theme(axis.text.x = element_text(angle=90)) +
  scale_y_continuous(labels = scales::percent) +
  labs(title = "\n Distribution of Follower Income Groups by Religion", 
       x = "\n Religion",
       fill = "Income Band") + 
  coord_flip()

#(4) What percent of respondents refused to report their income per group?
df1 %>%
  mutate(refused = ifelse(income == 'refused', "Y", "N")) %>%
  group_by(religion) %>%
  summarize(pct_refused = sum(ifelse(refused == 'Y',num_respondents,0))/sum(num_respondents)) %>%
  arrange(desc(pct_refused)) %>%
  mutate(religion = factor(religion, levels=religion)) %>%
  ggplot(aes(x=religion, y=pct_refused)) +
  geom_bar(aes(x=religion, fill=religion),stat='identity') +
  theme(axis.text.x = element_text(angle=90)) +
  labs(title = "Percent of Respondents Not Reporting Income by Religion", 
       x = "\n Religion", 
       y = "\n Percent Refused") +
  scale_y_continuous(labels = scales::percent)

#(5) What was the maximum income group for each religion?

df1 %>%
  filter(income != 'refused') %>%
  group_by(religion) %>%
  mutate(group_responses = sum(num_respondents),
         pct_group = num_respondents/group_responses) %>%
  group_by(religion) %>%
  filter(pct_group == max(pct_group)) %>% 
  select(religion, income, pct_group) %>% 
  ggplot() + 
  geom_bar(aes(x=religion, y=pct_group, fill=income), stat='identity') +
  theme(axis.text.x =  element_text(angle=90)) + 
  scale_y_continuous(labels = scales::percent) + 
  labs(title = "\n Plurarity Income Band per Religious Group", 
       x = "\n Religion", 
       y = "\n Percent of Group", 
       fill = "Income Band")

Dataset 2

Import and clean data

For this dataset, I’m going to clean it by completing the following steps:

  1. Import dataset from GitHub
  2. Split the “sex.and.age” column into two separate columns for sex and age respectively
  3. Remove the text from the “test.number” column to make it only hold the numeric value
  4. Change the column names to remove the period from them
  5. Rename the id field to “student_id”
  6. Convert term.1, term.2, and term.3 columns to a single column labeled “term” and move the value to a new column labeled “score”
  7. Remove the text from the newly created “term” column
  8. Change the values for sex to uppercase letters
  9. Convert sex, term, and test_number to be factors
ds2 = 'https://raw.githubusercontent.com/klmartin1998/cuny_datascience/main/DATA%20607/input/project2_student_data.csv'

df1_partb <- read.csv(ds2)

df1_partb
##    id   name phone sex.and.age test.number term.1 term.2 term.3
## 1   1   Mike   134        m_12      test 1     76     84     87
## 2   2  Linda   270        f_13      test 1     88     90     73
## 3   3    Sam   210        m_11      test 1     78     74     80
## 4   4 Esther   617        f_12      test 1     68     75     74
## 5   5   Mary   114        f_14      test 1     65     67     64
## 6   1   Mike   134        m_12      test 2     85     80     90
## 7   2  Linda   270        f_13      test 2     87     82     94
## 8   3    Sam   210        m_11      test 2     80     87     80
## 9   4 Esther   617        f_12      test 2     70     75     78
## 10  5   Mary   114        f_14      test 2     68     70     63
df2_partb <- df1_partb %>% 
  mutate(sex = str_match(sex.and.age, "[a-zA-Z]"),
                 age = str_match(sex.and.age, "\\d+"),
                 test.number = str_match(test.number, "\\d+")) %>% 
  select(-sex.and.age) %>%
  rename(student_id = id)
  


df2_partb <- df2_partb %>% janitor::clean_names()

columns = colnames(df2_partb)

df3_partb <- df2_partb %>%
  pivot_longer(columns[5:7], names_to = "term", values_to = "score")

df4_partb <- df3_partb %>% mutate(term = str_match(term, "\\d+"))

df5_partb <- df4_partb %>%
  mutate(sex = toupper(sex)) %>% 
  mutate(test_number = factor(test_number, order = TRUE, levels = c(1,2)), 
         sex = factor(sex), 
         phone = as.character(phone),
         age = as.numeric(age),
         term = factor(term, order = TRUE, levels = c(1,2,3)))


df5_partb
## # A tibble: 30 × 8
##    student_id name   phone test_number sex     age term  score
##         <int> <chr>  <chr> <ord>       <fct> <dbl> <ord> <int>
##  1          1 Mike   134   1           M        12 1        76
##  2          1 Mike   134   1           M        12 2        84
##  3          1 Mike   134   1           M        12 3        87
##  4          2 Linda  270   1           F        13 1        88
##  5          2 Linda  270   1           F        13 2        90
##  6          2 Linda  270   1           F        13 3        73
##  7          3 Sam    210   1           M        11 1        78
##  8          3 Sam    210   1           M        11 2        74
##  9          3 Sam    210   1           M        11 3        80
## 10          4 Esther 617   1           F        12 1        68
## # … with 20 more rows
#Output dataframe as .csv file
write_csv(df5_partb, "../output/project2_student_data_tidy.csv")

Analyze Dataset

For this dataset we will answer the following questions:

  1. What is the overall average test score, as well as the average test for each student, each gender, and each test?
  2. How many students are male vs. female?
  3. What is the average age for the group?

Answers: (1) The average overall test score is 77.7. See chart below for average test score by test number, student, and sex (2) 60% of students were Female and 40% were male (3) Overall the average age of the students was 12.4, with the average age amongst Females being 13, and the average age amongst Males being 11.5

df2 <- df5_partb



#(1) What is the average test score for each student, sex, and test_number?
(average = mean(df2$score))
## [1] 77.73333
df2 %>%
  group_by(name) %>%
  summarize(avg_score = mean(score)) %>%
  ggplot(aes(x=name, y=avg_score)) +
  geom_bar(stat='identity', aes(fill=name)) +
  labs(title = "\n Average Test Score per Student", 
       x = "\n Student", 
       y = "\n Average Test Score",
       fill = "Student") +
  geom_hline(yintercept = average, linetype="dashed")

  df2 %>%
  group_by(test_number) %>%
  summarize(avg_score = mean(score)) %>%
  ggplot(aes(x=test_number, y=avg_score)) + 
  geom_bar(stat='identity', aes(fill=test_number)) + 
  labs(title = "\n Average Test Score per Test", 
       x = "\n Test Number", 
       y = "\n Average Test Score",
       fill = "Test Number") +
  geom_hline(yintercept = average, linetype="dashed")

df2 %>%
  group_by(sex) %>%
  summarize(avg_score = mean(score)) %>%
  ggplot(aes(x=sex, y=avg_score)) + 
  geom_bar(stat='identity', aes(fill=sex)) +
  labs(title = "\n Average Test Score per Sex", 
       x = "\n Sex", 
       y = "\n Average Test Score",
       fill = "Sex") +
  geom_hline(yintercept = average, linetype="dashed")

#(3) How many students are male vs. female?
(df2 %>%
  select(name, sex) %>%
  unique() %>%
  group_by(sex) %>%
  summarize(n = n()) %>%
  mutate(pct_total = n/sum(n)))
## # A tibble: 2 × 3
##   sex       n pct_total
##   <fct> <int>     <dbl>
## 1 F         3       0.6
## 2 M         2       0.4
#(4) What is the average age for the group?
(df2 %>% 
  select(name, sex, age) %>% 
  distinct() %>% 
  summarize(avg_age = mean(age)))
## # A tibble: 1 × 1
##   avg_age
##     <dbl>
## 1    12.4
(df2 %>% 
  select(name, sex, age) %>% 
  distinct() %>% 
  group_by(sex) %>%
  summarize(avg_age = mean(age)))
## # A tibble: 2 × 2
##   sex   avg_age
##   <fct>   <dbl>
## 1 F        13  
## 2 M        11.5

Part 3 - African American Therapist in Los Angeles, CA

For this part of the project, I started off by scraping this [website] (https://www.psychologytoday.com/us/therapists/ca/los-angeles?category=african-american) to create a .csv file with a list of African American therapist in Los Angeles, CA. To clean and convert the data to a tidy format, I made the following transformations

  1. Import the data from .csv file on GitHub to Dataframe
  2. Loop through the existing dataframe and and make updates for each group of rows that correspond to a single therapist
  3. Create new columns X4 and X5 that are the labels for the data in the rows
  4. Using the new columns, spread the data into X2 and X3 such that their values are now assigned to the labels used in X4 and X5
  5. For column with the therapist name (X1), convert blank strings to NA so we can fill in the blanks
  6. For all columns, fill the blanks in the column with any completed value in the column
  7. Take the first row (which is a completed row) and append it to a blank vector
  8. Rename label for X1 to “name”
  9. Remove excess leading and trailing whitespace characters from title and name fields
  10. Remove newline character and any set of 2+ consecutive spaces with a single space
  11. Remove leading and trailing whitespace from city_state_zip field
  12. Sepate the values in the city_state_zip field into separate fields for city, state, and zip
  13. Convert the online and accepting new patients fields to hold single-character codes
  14. Extract the title from the title field (and discard the licensure names)
ds3 = 'https://raw.githubusercontent.com/klmartin1998/cuny_datascience/main/DATA%20607/input/unclean_aatherapist_info.csv'

df1_partc <- read.csv(ds3)
df1_partc
##                                                                   X1
## 1                                                          Uriah Cty
## 2                                                                   
## 3                                                                   
## 4                                                                   
## 5                                                        James Birks
## 6                                                                   
## 7                                                                   
## 8                                                                   
## 9                                                      Taronda Jones
## 10                                                                  
## 11                                                                  
## 12                                                                  
## 13                                                Christina Harrison
## 14                                                                  
## 15                                                                  
## 16                                                                  
## 17                                              Eric Michael Katende
## 18                                                                  
## 19                                                                  
## 20                                                                  
## 21                                                 Brittany Williams
## 22                                                                  
## 23                                                                  
## 24                                                                  
## 25                                                  Claudia Williams
## 26                                                                  
## 27                                                                  
## 28                                                                  
## 29                                                   Bradlisia Dixon
## 30                                                                  
## 31                                                                  
## 32                                                                  
## 33                                                  Dr. Daryl M Rowe
## 34                                                                  
## 35                                                                  
## 36                                                                  
## 37                                                  Camille Tenerife
## 38                                                                  
## 39                                                                  
## 40                                                                  
## 41                                             Dr. Jacquelyn Johnson
## 42                                                                  
## 43                                                                  
## 44                                                                  
## 45                                                       Uche Okolie
## 46                                                                  
## 47                                                                  
## 48                                                                  
## 49                                                  Matthew Brinkley
## 50                                                                  
## 51                                                                  
## 52                                                                  
## 53                                                 Valencia Harriott
## 54                                                                  
## 55                                                                  
## 56                                                                  
## 57                                                   Ashley Merriman
## 58                                                                  
## 59                                                                  
## 60                                                                  
## 61                                               Geoffrey E Sherrell
## 62                                                                  
## 63                                                                  
## 64                                                                  
## 65                                                Domenique Harrison
## 66                                                                  
## 67                                                                  
## 68                                                                  
## 69                                                            Fox M.
## 70                                                                  
## 71                                                                  
## 72                                                                  
## 73                                                   Sebrena Thurton
## 74                                                                  
## 75                                                                  
## 76                                                                  
## 77                                                  Anthony Chambers
## 78                                                                  
## 79                                                                  
## 80                                                                  
## 81                                             Dr. Jacquelyn Johnson
## 82                                                                  
## 83                                                                  
## 84                                                                  
## 85                                                     Taronda Jones
## 86                                                                  
## 87                                                                  
## 88                                                                  
## 89                                                        Jaha Higgs
## 90                                                                  
## 91                                                                  
## 92                                                                  
## 93                                                Domenique Harrison
## 94                                                                  
## 95                                                                  
## 96                                                                  
## 97                                                  Claudia Williams
## 98                                                                  
## 99                                                                  
## 100                                                                 
## 101                                         Quinney & Associates Inc
## 102                                                                 
## 103                                                                 
## 104                                                                 
## 105                                                         Joy Pate
## 106                                                                 
## 107                                                                 
## 108                                                                 
## 109                                              Geoffrey E Sherrell
## 110                                                                 
## 111                                                                 
## 112                                                                 
## 113                                          Kimani Norrington-Sands
## 114                                                                 
## 115                                                                 
## 116                                                                 
## 117                                                      James Birks
## 118                                                                 
## 119                                                                 
## 120                                                                 
## 121                                                    Saundre Allen
## 122                                                                 
## 123                                                                 
## 124                                                                 
## 125                                                  Cortney Beasley
## 126                                                                 
## 127                                                                 
## 128                                                                 
## 129                         Well-Play Counseling & Wellbeing Center 
## 130                                                                 
## 131                                                                 
## 132                                                                 
## 133                                        Taisha L. Caldwell-Harvey
## 134                                                                 
## 135                                                                 
## 136                                                                 
## 137                                                   Heather Primus
## 138                                                                 
## 139                                                                 
## 140                                                                 
## 141                                                    Konjit V Page
## 142                                                                 
## 143                                                                 
## 144                                                                 
## 145                                                   Rickey A Bates
## 146                                                                 
## 147                                                                 
## 148                                                                 
## 149                                                Dr. Bree McDaniel
## 150                                                                 
## 151                                                                 
## 152                                                                 
## 153                                     The Divine Perseverance, LLC
## 154                                                                 
## 155                                                                 
## 156                                                                 
## 157                                                   Tabitha Taylor
## 158                                                                 
## 159                                                                 
## 160                                                                 
## 161                                                Dr. Bree McDaniel
## 162                                                                 
## 163                                                                 
## 164                                                                 
## 165                                                       TTWNT, LLC
## 166                                                                 
## 167                                                                 
## 168                                                                 
## 169                                   The Neighborhood Therapist, PC
## 170                                                                 
## 171                                                                 
## 172                                                                 
## 173                                                Jacqueline Benson
## 174                                                                 
## 175                                                                 
## 176                                                                 
## 177                                                Deeper Than Color
## 178                                                                 
## 179                                                                 
## 180                                                                 
## 181                                                    Lynda K. Cash
## 182                                                                 
## 183                                                                 
## 184                                                                 
## 185                                                 Ashanique Nelson
## 186                                                                 
## 187                                                                 
## 188                                                                 
## 189                                                  Ceshaun Hankins
## 190                                                                 
## 191                                                                 
## 192                                                                 
## 193                                       David Alexander Summerhill
## 194                                                                 
## 195                                                                 
## 196                                                                 
## 197                                                      Cyndle Rios
## 198                                                                 
## 199                                                                 
## 200                                                                 
## 201                                                   Angela Shaiman
## 202                                                                 
## 203                                                                 
## 204                                                                 
## 205                                            Dashamelle Bowie Russ
## 206                                                                 
## 207                                                                 
## 208                                                                 
## 209                                            Chosen Family Therapy
## 210                                                                 
## 211                                                                 
## 212                                                                 
## 213                                             Ahneishia Washington
## 214                                                                 
## 215                                                                 
## 216                                                                 
## 217                                           Christine Buford Gomez
## 218                                                                 
## 219                                                                 
## 220                                                                 
## 221                                                   Monique Dozier
## 222                                                                 
## 223                                                                 
## 224                                                                 
## 225                                            April K Adams Edwards
## 226                                                                 
## 227                                                                 
## 228                                                                 
## 229                                                      Nami Tefera
## 230                                                                 
## 231                                                                 
## 232                                                                 
## 233                            Christhmus (Christopher Chu) Presence
## 234                                                                 
## 235                                                                 
## 236                                                                 
## 237                                                  Charles Johnson
## 238                                                                 
## 239                                                                 
## 240                                                                 
## 241                                                  Lauren McMillan
## 242                                                                 
## 243                                                                 
## 244                                                                 
## 245                                              Autumn Joy Jimerson
## 246                                                                 
## 247                                                                 
## 248                                                                 
## 249                             PatrickLyra Wilder LMFT & Associates
## 250                                                                 
## 251                                                                 
## 252                                                                 
## 253                                                  Akilah Reynolds
## 254                                                                 
## 255                                                                 
## 256                                                                 
## 257                              Be Curious Therapy, Jean Pappalardo
## 258                                                                 
## 259                                                                 
## 260                                                                 
## 261                                             TD Wellness Services
## 262                                                                 
## 263                                                                 
## 264                                                                 
## 265                                            April K Adams Edwards
## 266                                                                 
## 267                                                                 
## 268                                                                 
## 269               The Weight Room: Therapy for Black and Brown Males
## 270                                                                 
## 271                                                                 
## 272                                                                 
## 273                                              Freedom's Flow Pllc
## 274                                                                 
## 275                                                                 
## 276                                                                 
## 277                                                 Marisol Cendejas
## 278                                                                 
## 279                                                                 
## 280                                                                 
## 281                                                     Patricia Gay
## 282                                                                 
## 283                                                                 
## 284                                                                 
## 285                                                     Lanie Goueth
## 286                                                                 
## 287                                                                 
## 288                                                                 
## 289                                                  Jeshurun Joseph
## 290                                                                 
## 291                                                                 
## 292                                                                 
## 293                                                Michelle Matthews
## 294                                                                 
## 295                                                                 
## 296                                                                 
## 297                                                   Millicent Rose
## 298                                                                 
## 299                                                                 
## 300                                                                 
## 301                                                 Shaina Nicholson
## 302                                                                 
## 303                                                                 
## 304                                                                 
## 305                                      Jasmine Bell Family Therapy
## 306                                                                 
## 307                                                                 
## 308                                                                 
## 309                                          Therapy Lab Los Angeles
## 310                                                                 
## 311                                                                 
## 312                                                                 
## 313                                   Astute Mind Therapy & Wellness
## 314                                                                 
## 315                                                                 
## 316                                                                 
## 317                    Eagle Rock Therapy, Progressive and Affirming
## 318                                                                 
## 319                                                                 
## 320                                                                 
## 321                                                 Anthony Phillips
## 322                                                                 
## 323                                                                 
## 324                                                                 
## 325                                                  Jeshana Johnson
## 326                                                                 
## 327                                                                 
## 328                                                                 
## 329                                                  Tiffani Calcote
## 330                                                                 
## 331                                                                 
## 332                                                                 
## 333                                     Rhonda Taylor EMDR Therapist
## 334                                                                 
## 335                                                                 
## 336                                                                 
## 337                                                     Patrice Bone
## 338                                                                 
## 339                                                                 
## 340                                                                 
## 341                                                    Arnold Acquah
## 342                                                                 
## 343                                                                 
## 344                                                                 
## 345                                                 Kelli Washington
## 346                                                                 
## 347                                                                 
## 348                                                                 
## 349                                                     Jenea Howard
## 350                                                                 
## 351                                                                 
## 352                                                                 
## 353                                                 Ashley R. Taylor
## 354                                                                 
## 355                                                                 
## 356                                                                 
## 357                                                     Stacy Scates
## 358                                                                 
## 359                                                                 
## 360                                                                 
## 361                                      Jasmine Bell Family Therapy
## 362                                                                 
## 363                                                                 
## 364                                                                 
## 365                                                   Megan Williams
## 366                                                                 
## 367                                                                 
## 368                                                                 
## 369                                                     Patricia Gay
## 370                                                                 
## 371                                                                 
## 372                                                                 
## 373                                                     Saraa D. Lee
## 374                                                                 
## 375                                                                 
## 376                                                                 
## 377                                              Cinnamon R. Johnson
## 378                                                                 
## 379                                                                 
## 380                                                                 
## 381                                                   Melvin M Moore
## 382                                                                 
## 383                                                                 
## 384                                                                 
## 385                                         Alexandria Tillard-Gates
## 386                                                                 
## 387                                                                 
## 388                                                                 
## 389                                                    Lauren Thomas
## 390                                                                 
## 391                                                                 
## 392                                                                 
## 393                                               Dr. Jeff J. Rocker
## 394                                                                 
## 395                                                                 
## 396                                                                 
## 397                                                      Joshua Polk
## 398                                                                 
## 399                                                                 
## 400                                                                 
## 401                                                  Jessiline Berry
## 402                                                                 
## 403                                                                 
## 404                                                                 
## 405                                                    Nicole Grimes
## 406                                                                 
## 407                                                                 
## 408                                                                 
## 409                                                    Arnold Acquah
## 410                                                                 
## 411                                                                 
## 412                                                                 
## 413                                                      Joshua Polk
## 414                                                                 
## 415                                                                 
## 416                                                                 
## 417                                                    Chelsey Reese
## 418                                                                 
## 419                                                                 
## 420                                                                 
## 421                                          House of Wellness, PLLC
## 422                                                                 
## 423                                                                 
## 424                                                                 
## 425                                               Embodiedcounseling
## 426                                                                 
## 427                                                                 
## 428                                                                 
## 429                                                  Jeshana Johnson
## 430                                                                 
## 431                                                                 
## 432                                                                 
## 433                                                Kehiante Mckinley
## 434                                                                 
## 435                                                                 
## 436                                                                 
## 437                                          Therapy Lab Los Angeles
## 438                                                                 
## 439                                                                 
## 440                                                                 
## 441                                                     Lanie Goueth
## 442                                                                 
## 443                                                                 
## 444                                                                 
## 445                                 AMR Therapy and Support Services
## 446                                                                 
## 447                                                                 
## 448                                                                 
## 449                                                  Carmon Williams
## 450                                                                 
## 451                                                                 
## 452                                                                 
## 453                                                     Patrice Bone
## 454                                                                 
## 455                                                                 
## 456                                                                 
## 457                                                Michelle Matthews
## 458                                                                 
## 459                                                                 
## 460                                                                 
## 461                                                  Tashia Chambers
## 462                                                                 
## 463                                                                 
## 464                                                                 
## 465                                                   Margena Carter
## 466                                                                 
## 467                                                                 
## 468                                                                 
## 469                                  Clarity Family Therapy Services
## 470                                                                 
## 471                                                                 
## 472                                                                 
## 473                                                      Aaron Jones
## 474                                                                 
## 475                                                                 
## 476                                                                 
## 477                                                   Millicent Rose
## 478                                                                 
## 479                                                                 
## 480                                                                 
## 481                                                   Leslie Gilliam
## 482                                                                 
## 483                                                                 
## 484                                                                 
## 485                                               Cheryl O'Neal Dunn
## 486                                                                 
## 487                                                                 
## 488                                                                 
## 489                                                     Maya Jackson
## 490                                                                 
## 491                                                                 
## 492                                                                 
## 493                                     Rhonda Taylor EMDR Therapist
## 494                                                                 
## 495                                                                 
## 496                                                                 
## 497                                              Brittany Richardson
## 498                                                                 
## 499                                                                 
## 500                                                                 
## 501                                          Atwater Village Therapy
## 502                                                                 
## 503                                                                 
## 504                                                                 
## 505                                               Embodiedcounseling
## 506                                                                 
## 507                                                                 
## 508                                                                 
## 509                                   Astute Mind Therapy & Wellness
## 510                                                                 
## 511                                                                 
## 512                                                                 
## 513                    Eagle Rock Therapy, Progressive and Affirming
## 514                                                                 
## 515                                                                 
## 516                                                                 
## 517                                          Kristin Michelle Howard
## 518                                                                 
## 519                                                                 
## 520                                                                 
## 521                                                 Cay Carroll Kidd
## 522                                                                 
## 523                                                                 
## 524                                                                 
## 525                                                 Dr. Janai Harris
## 526                                                                 
## 527                                                                 
## 528                                                                 
## 529                                                    Arnold Acquah
## 530                                                                 
## 531                                                                 
## 532                                                                 
## 533                                                 Konstance Castle
## 534                                                                 
## 535                                                                 
## 536                                                                 
## 537                                                    Nicole Grimes
## 538                                                                 
## 539                                                                 
## 540                                                                 
## 541                                                     Velma Kamara
## 542                                                                 
## 543                                                                 
## 544                                                                 
## 545                                                   Tenesha Garcia
## 546                                                                 
## 547                                                                 
## 548                                                                 
## 549                                      Jasmine Bell Family Therapy
## 550                                                                 
## 551                                                                 
## 552                                                                 
## 553                                                  Jeshana Johnson
## 554                                                                 
## 555                                                                 
## 556                                                                 
## 557                                          McKenzie Charles Strong
## 558                                                                 
## 559                                                                 
## 560                                                                 
## 561                   Nia J. Henderson, Center for Mindful Living LA
## 562                                                                 
## 563                                                                 
## 564                                                                 
## 565                                          McKenzie Charles Strong
## 566                                                                 
## 567                                                                 
## 568                                                                 
## 569                                          Impact Counseling Group
## 570                                                                 
## 571                                                                 
## 572                                                                 
## 573                                                    Sostenes Lima
## 574                                                                 
## 575                                                                 
## 576                                                                 
## 577                                                   Brittany Jones
## 578                                                                 
## 579                                                                 
## 580                                                                 
## 581                               Beautiful Butterfly Community Corp
## 582                                                                 
## 583                                                                 
## 584                                                                 
## 585                                 AMR Therapy and Support Services
## 586                                                                 
## 587                                                                 
## 588                                                                 
## 589                                                   Millicent Rose
## 590                                                                 
## 591                                                                 
## 592                                                                 
## 593                                                      Aaron Jones
## 594                                                                 
## 595                                                                 
## 596                                                                 
## 597                                      Jasmine Bell Family Therapy
## 598                                                                 
## 599                                                                 
## 600                                                                 
## 601                                   Astute Mind Therapy & Wellness
## 602                                                                 
## 603                                                                 
## 604                                                                 
## 605                                                    Robyn Roberts
## 606                                                                 
## 607                                                                 
## 608                                                                 
## 609                                              Cinnamon R. Johnson
## 610                                                                 
## 611                                                                 
## 612                                                                 
## 613                                                     Patrice Bone
## 614                                                                 
## 615                                                                 
## 616                                                                 
## 617                                                 Dr. Janai Harris
## 618                                                                 
## 619                                                                 
## 620                                                                 
## 621                                                Kehiante Mckinley
## 622                                                                 
## 623                                                                 
## 624                                                                 
## 625                                                Earlee Washington
## 626                                                                 
## 627                                                                 
## 628                                                                 
## 629                                                    Janelle Owens
## 630                                                                 
## 631                                                                 
## 632                                                                 
## 633                                        Dr. Priscilla Psy.D. LCSW
## 634                                                                 
## 635                                                                 
## 636                                                                 
## 637                                                      Jakuta Ptah
## 638                                                                 
## 639                                                                 
## 640                                                                 
## 641                                          McKenzie Charles Strong
## 642                                                                 
## 643                                                                 
## 644                                                                 
## 645                                                     Patricia Gay
## 646                                                                 
## 647                                                                 
## 648                                                                 
## 649                                                   Megan Williams
## 650                                                                 
## 651                                                                 
## 652                                                                 
## 653                                  Clarity Family Therapy Services
## 654                                                                 
## 655                                                                 
## 656                                                                 
## 657                                      A Healing Start Counseling 
## 658                                                                 
## 659                                                                 
## 660                                                                 
## 661                    Eagle Rock Therapy, Progressive and Affirming
## 662                                                                 
## 663                                                                 
## 664                                                                 
## 665                                          House of Wellness, PLLC
## 666                                                                 
## 667                                                                 
## 668                                                                 
## 669                                  The Village Mental Health Group
## 670                                                                 
## 671                                                                 
## 672                                                                 
## 673                                         Wings of The Future, NFP
## 674                                                                 
## 675                                                                 
## 676                                                                 
## 677                   Mackey Counseling Services, a LCSW Corporation
## 678                                                                 
## 679                                                                 
## 680                                                                 
## 681                                                 Anastasia Gorden
## 682                                                                 
## 683                                                                 
## 684                                                                 
## 685                                          Amani-Breanna Alexander
## 686                                                                 
## 687                                                                 
## 688                                                                 
## 689                                                     Imari Childs
## 690                                                                 
## 691                                                                 
## 692                                                                 
## 693                                                    Maudisa Meroe
## 694                                                                 
## 695                                                                 
## 696                                                                 
## 697                                                       Paije Rush
## 698                                                                 
## 699                                                                 
## 700                                                                 
## 701                                                   Nekolas Milton
## 702                                                                 
## 703                                                                 
## 704                                                                 
## 705                                                 Saarah D Nicolas
## 706                                                                 
## 707                                                                 
## 708                                                                 
## 709                                                  Veronica Holmes
## 710                                                                 
## 711                                                                 
## 712                                                                 
## 713                                      Capricorn Counseling Center
## 714                                                                 
## 715                                                                 
## 716                                                                 
## 717                                                   Renaldo Moodie
## 718                                                                 
## 719                                                                 
## 720                                                                 
## 721                                          Amani-Breanna Alexander
## 722                                                                 
## 723                                                                 
## 724                                                                 
## 725                                               Jeffrey Boyd, Inc.
## 726                                                                 
## 727                                                                 
## 728                                                                 
## 729                                         Wellplace Psychotherapy 
## 730                                                                 
## 731                                                                 
## 732                                                                 
## 733                             Mirta Innis-Thompson Psychotherapist
## 734                                                                 
## 735                                                                 
## 736                                                                 
## 737                                         Wings of The Future, NFP
## 738                                                                 
## 739                                                                 
## 740                                                                 
## 741                                                   Karin Pleasant
## 742                                                                 
## 743                                                                 
## 744                                                                 
## 745                                                    Maudisa Meroe
## 746                                                                 
## 747                                                                 
## 748                                                                 
## 749                                                   Renaldo Moodie
## 750                                                                 
## 751                                                                 
## 752                                                                 
## 753                                         Nicole Barkopoulos, LMFT
## 754                                                                 
## 755                                                                 
## 756                                                                 
## 757                                                  Veronica Holmes
## 758                                                                 
## 759                                                                 
## 760                                                                 
## 761                                                     Sonja Carter
## 762                                                                 
## 763                                                                 
## 764                                                                 
## 765                                                 Giselle L. Jones
## 766                                                                 
## 767                                                                 
## 768                                                                 
## 769                                                Jacqueline R Pinn
## 770                                                                 
## 771                                                                 
## 772                                                                 
## 773                                                    Kellee M Kemp
## 774                                                                 
## 775                                                                 
## 776                                                                 
## 777                                                 Rufus Tony Spann
## 778                                                                 
## 779                                                                 
## 780                                                                 
## 781                                            Antionette D Brookins
## 782                                                                 
## 783                                                                 
## 784                                                                 
## 785                                          Tim Rogers Licensed Mft
## 786                                                                 
## 787                                                                 
## 788                                                                 
## 789                                               Richard Sypniewski
## 790                                                                 
## 791                                                                 
## 792                                                                 
## 793                                                  Michelle Cauley
## 794                                                                 
## 795                                                                 
## 796                                                                 
## 797                                                    Myisha Battle
## 798                                                                 
## 799                                                                 
## 800                                                                 
## 801                            Behavioral Health Solutions 365, INC.
## 802                                                                 
## 803                                                                 
## 804                                                                 
## 805                                                  Michelle Cauley
## 806                                                                 
## 807                                                                 
## 808                                                                 
## 809                                                    Ilita Beckham
## 810                                                                 
## 811                                                                 
## 812                                                                 
## 813                                                 Inertia Q DeWitt
## 814                                                                 
## 815                                                                 
## 816                                                                 
## 817                                                 Kimberly Nenemay
## 818                                                                 
## 819                                                                 
## 820                                                                 
## 821                                                    Jon-Paul Bird
## 822                                                                 
## 823                                                                 
## 824                                                                 
## 825                                                  Janisha Mickens
## 826                                                                 
## 827                                                                 
## 828                                                                 
## 829                                                     Denise Dugan
## 830                                                                 
## 831                                                                 
## 832                                                                 
## 833                                      Brandon Reginald Washington
## 834                                                                 
## 835                                                                 
## 836                                                                 
## 837                                                        Nay Smith
## 838                                                                 
## 839                                                                 
## 840                                                                 
## 841                                                 Maureen Williams
## 842                                                                 
## 843                                                                 
## 844                                                                 
## 845                                             Kailah Joy DeJurnett
## 846                                                                 
## 847                                                                 
## 848                                                                 
## 849                                                   Cheryl D Casey
## 850                                                                 
## 851                                                                 
## 852                                                                 
## 853                                                    Natalie Jones
## 854                                                                 
## 855                                                                 
## 856                                                                 
## 857                                                  Dr. Neko Milton
## 858                                                                 
## 859                                                                 
## 860                                                                 
## 861                                             Dr. LaQeishia Hagans
## 862                                                                 
## 863                                                                 
## 864                                                                 
## 865                                               Jamal Raheem Oakes
## 866                                                                 
## 867                                                                 
## 868                                                                 
## 869                                                 Selena J McQueen
## 870                                                                 
## 871                                                                 
## 872                                                                 
## 873                                                      Danine Dean
## 874                                                                 
## 875                                                                 
## 876                                                                 
## 877                                                    Nicole Brooks
## 878                                                                 
## 879                                                                 
## 880                                                                 
## 881                Social Work Support, Inc Mental Health Counseling
## 882                                                                 
## 883                                                                 
## 884                                                                 
## 885                                                 Maureen Williams
## 886                                                                 
## 887                                                                 
## 888                                                                 
## 889                                                   Cheryl D Casey
## 890                                                                 
## 891                                                                 
## 892                                                                 
## 893                                  Dr. Tamala Black and Associates
## 894                                                                 
## 895                                                                 
## 896                                                                 
## 897                                             Be Mindful and Well 
## 898                                                                 
## 899                                                                 
## 900                                                                 
## 901                                                    Nicole Brooks
## 902                                                                 
## 903                                                                 
## 904                                                                 
## 905               Mending Pieces LLC: Group Therapy for Black Women 
## 906                                                                 
## 907                                                                 
## 908                                                                 
## 909                                           Alvin Louis Gilmore Jr
## 910                                                                 
## 911                                                                 
## 912                                                                 
## 913                                                        S. Rogers
## 914                                                                 
## 915                                                                 
## 916                                                                 
## 917                                         Candice Michelle Clayton
## 918                                                                 
## 919                                                                 
## 920                                                                 
## 921                                                  Drsean Franklin
## 922                                                                 
## 923                                                                 
## 924                                                                 
## 925                               Hope Empowers Counseling Services 
## 926                                                                 
## 927                                                                 
## 928                                                                 
## 929                                                   Aundrea Paxton
## 930                                                                 
## 931                                                                 
## 932                                                                 
## 933                                             Dr. LaQeishia Hagans
## 934                                                                 
## 935                                                                 
## 936                                                                 
## 937                                                      Danine Dean
## 938                                                                 
## 939                                                                 
## 940                                                                 
## 941                                                     Sherry Ellis
## 942                                                                 
## 943                                                                 
## 944                                                                 
## 945                                                    Natalie Jones
## 946                                                                 
## 947                                                                 
## 948                                                                 
## 949                                      Brandon Reginald Washington
## 950                                                                 
## 951                                                                 
## 952                                                                 
## 953                                          Thrive in Wellness, LLC
## 954                                                                 
## 955                                                                 
## 956                                                                 
## 957                                                   Danielle Gautt
## 958                                                                 
## 959                                                                 
## 960                                                                 
## 961                                            Wanjiru Waweru-Benson
## 962                                                                 
## 963                                                                 
## 964                                                                 
## 965                                                   Aundrea Paxton
## 966                                                                 
## 967                                                                 
## 968                                                                 
## 969                                             Kailah Joy DeJurnett
## 970                                                                 
## 971                                                                 
## 972                                                                 
## 973                                              Percival Fisher Jr.
## 974                                                                 
## 975                                                                 
## 976                                                                 
## 977                                                    Jennifer Kerr
## 978                                                                 
## 979                                                                 
## 980                                                                 
## 981                               Therapeutic Concepts-SAP Services 
## 982                                                                 
## 983                                                                 
## 984                                                                 
## 985                                                     Denise Dugan
## 986                                                                 
## 987                                                                 
## 988                                                                 
## 989                                                 Selena J McQueen
## 990                                                                 
## 991                                                                 
## 992                                                                 
## 993                                                        S. Rogers
## 994                                                                 
## 995                                                                 
## 996                                                                 
## 997                                  Dr. Tamala Black and Associates
## 998                                                                 
## 999                                                                 
## 1000                                                                
## 1001                                                  Cheryl D Casey
## 1002                                                                
## 1003                                                                
## 1004                                                                
## 1005                                                Maureen Williams
## 1006                                                                
## 1007                                                                
## 1008                                                                
## 1009                                          Alvin Louis Gilmore Jr
## 1010                                                                
## 1011                                                                
## 1012                                                                
## 1013                                              Carissa Lataillade
## 1014                                                                
## 1015                                                                
## 1016                                                                
## 1017                                                  Cirrena Troutt
## 1018                                                                
## 1019                                                                
## 1020                                                                
## 1021                                                   Mary N Parker
## 1022                                                                
## 1023                                                                
## 1024                                                                
## 1025                                            Aviance Rhome-Boroff
## 1026                                                                
## 1027                                                                
## 1028                                                                
## 1029                                              Shauntis L. Bussey
## 1030                                                                
## 1031                                                                
## 1032                                                                
## 1033                                            Akilah Bakeer-Pullum
## 1034                                                                
## 1035                                                                
## 1036                                                                
## 1037                                                  Joyce Humphrey
## 1038                                                                
## 1039                                                                
## 1040                                                                
## 1041                                            Akilah Bakeer-Pullum
## 1042                                                                
## 1043                                                                
## 1044                                                                
## 1045                                                Terrie L Pittman
## 1046                                                                
## 1047                                                                
## 1048                                                                
## 1049                                                   Kalisha Crone
## 1050                                                                
## 1051                                                                
## 1052                                                                
## 1053                                            Aviance Rhome-Boroff
## 1054                                                                
## 1055                                                                
## 1056                                                                
## 1057                   Carla Michelle Coaching & Consulting Services
## 1058                                                                
## 1059                                                                
## 1060                                                                
## 1061                                                  Tristin Victor
## 1062                                                                
## 1063                                                                
## 1064                                                                
## 1065                                                    Jasmine Eddy
## 1066                                                                
## 1067                                                                
## 1068                                                                
## 1069                                              Christine Williams
## 1070                                                                
## 1071                                                                
## 1072                                                                
## 1073                                              Carissa Lataillade
## 1074                                                                
## 1075                                                                
## 1076                                                                
## 1077                                                De Jeanne Taylor
## 1078                                                                
## 1079                                                                
## 1080                                                                
## 1081                                           Cymone N. Damon-David
## 1082                                                                
## 1083                                                                
## 1084                                                                
## 1085                                                   Anthony Brown
## 1086                                                                
## 1087                                                                
## 1088                                                                
## 1089                                              Shauntis L. Bussey
## 1090                                                                
## 1091                                                                
## 1092                                                                
## 1093                                                 Nathaniel Lloyd
## 1094                                                                
## 1095                                                                
## 1096                                                                
## 1097                                            Christopher Harriott
## 1098                                                                
## 1099                                                                
## 1100                                                                
## 1101                                                  Joyce Humphrey
## 1102                                                                
## 1103                                                                
## 1104                                                                
## 1105                                                   Brandy C Reid
## 1106                                                                
## 1107                                                                
## 1108                                                                
## 1109                                 Clear Thoughts Therapy & Beyond
## 1110                                                                
## 1111                                                                
## 1112                                                                
## 1113                                                 Ranique Hopkins
## 1114                                                                
## 1115                                                                
## 1116                                                                
## 1117                                              Tanisha Thelemaque
## 1118                                                                
## 1119                                                                
## 1120                                                                
## 1121                                                  Joyce Humphrey
## 1122                                                                
## 1123                                                                
## 1124                                                                
## 1125                                                   Brandy C Reid
## 1126                                                                
## 1127                                                                
## 1128                                                                
## 1129                                                   Kalisha Crone
## 1130                                                                
## 1131                                                                
## 1132                                                                
## 1133                                                 Carrie Ann Gray
## 1134                                                                
## 1135                                                                
## 1136                                                                
## 1137                                            Aviance Rhome-Boroff
## 1138                                                                
## 1139                                                                
## 1140                                                                
## 1141                                                 Jeremiah Knight
## 1142                                                                
## 1143                                                                
## 1144                                                                
## 1145                                                De Jeanne Taylor
## 1146                                                                
## 1147                                                                
## 1148                                                                
## 1149                                                    Jasmine Eddy
## 1150                                                                
## 1151                                                                
## 1152                                                                
## 1153                                                   Lauren Ludlow
## 1154                                                                
## 1155                                                                
## 1156                                                                
## 1157                                              Shauntis L. Bussey
## 1158                                                                
## 1159                                                                
## 1160                                                                
## 1161                   Carla Michelle Coaching & Consulting Services
## 1162                                                                
## 1163                                                                
## 1164                                                                
## 1165                                              Christine Williams
## 1166                                                                
## 1167                                                                
## 1168                                                                
## 1169                                                 Brandi Milliner
## 1170                                                                
## 1171                                                                
## 1172                                                                
## 1173                                                     Tameca Dove
## 1174                                                                
## 1175                                                                
## 1176                                                                
## 1177                                        Bobette Jamison-Harrison
## 1178                                                                
## 1179                                                                
## 1180                                                                
## 1181                                                  Teisha Y. Levi
## 1182                                                                
## 1183                                                                
## 1184                                                                
## 1185                                                   Briana Driver
## 1186                                                                
## 1187                                                                
## 1188                                                                
## 1189                                                Jordan Gutierrez
## 1190                                                                
## 1191                                                                
## 1192                                                                
## 1193                                                    Tracie Tyler
## 1194                                                                
## 1195                                                                
## 1196                                                                
## 1197                                                   Tumini Sekibo
## 1198                                                                
## 1199                                                                
## 1200                                                                
## 1201                                                     Tameca Dove
## 1202                                                                
## 1203                                                                
## 1204                                                                
## 1205                                               Jacqueline Gordon
## 1206                                                                
## 1207                                                                
## 1208                                                                
## 1209                                              Dr. Valinda Bowens
## 1210                                                                
## 1211                                                                
## 1212                                                                
## 1213                                                 Vincente Mozell
## 1214                                                                
## 1215                                                                
## 1216                                                                
## 1217                                               Ryan Ashley Brown
## 1218                                                                
## 1219                                                                
## 1220                                                                
## 1221                                         Paper Cranes Counseling
## 1222                                                                
## 1223                                                                
## 1224                                                                
## 1225                                           Pure Serenity Therapy
## 1226                                                                
## 1227                                                                
## 1228                                                                
## 1229                                             Ife Sangode-Olaitan
## 1230                                                                
## 1231                                                                
## 1232                                                                
## 1233                                                 Courtni Hawkins
## 1234                                                                
## 1235                                                                
## 1236                                                                
## 1237                                                Raenisha D. Love
## 1238                                                                
## 1239                                                                
## 1240                                                                
## 1241                                                      A'jah Love
## 1242                                                                
## 1243                                                                
## 1244                                                                
## 1245   Jocelyn Morris-Bryant Morant Clinical Services Group Practice
## 1246                                                                
## 1247                                                                
## 1248                                                                
## 1249                                               Francia Telesford
## 1250                                                                
## 1251                                                                
## 1252                                                                
## 1253                                      Dr. Christina M. Charlotin
## 1254                                                                
## 1255                                                                
## 1256                                                                
## 1257                                                Tiffany A Wright
## 1258                                                                
## 1259                                                                
## 1260                                                                
## 1261                                               Nefertiti DeSilva
## 1262                                                                
## 1263                                                                
## 1264                                                                
## 1265                                                 K'Hara Mckinney
## 1266                                                                
## 1267                                                                
## 1268                                                                
## 1269                                                   Ludine Pierre
## 1270                                                                
## 1271                                                                
## 1272                                                                
## 1273                                                    Brandy Hardy
## 1274                                                                
## 1275                                                                
## 1276                                                                
## 1277              Expansive Therapy - Start Online Therapy This Week
## 1278                                                                
## 1279                                                                
## 1280                                                                
## 1281                                                 DeMonta Whiting
## 1282                                                                
## 1283                                                                
## 1284                                                                
## 1285                                                  Janet B Shiver
## 1286                                                                
## 1287                                                                
## 1288                                                                
## 1289                                                Mishanda Freeman
## 1290                                                                
## 1291                                                                
## 1292                                                                
## 1293                                                   Crystal Young
## 1294                                                                
## 1295                                                                
## 1296                                                                
## 1297                                                      Evan Davis
## 1298                                                                
## 1299                                                                
## 1300                                                                
## 1301                                              Shaquita R Junious
## 1302                                                                
## 1303                                                                
## 1304                                                                
## 1305                                          Christopher Richardson
## 1306                                                                
## 1307                                                                
## 1308                                                                
## 1309                                                  Mariane Makkar
## 1310                                                                
## 1311                                                                
## 1312                                                                
## 1313                                               Jennifer Robinson
## 1314                                                                
## 1315                                                                
## 1316                                                                
## 1317                                                     Renee Curry
## 1318                                                                
## 1319                                                                
## 1320                                                                
## 1321                                                      Cleo Oubre
## 1322                                                                
## 1323                                                                
## 1324                                                                
## 1325                                       Veronica D Swink-Williams
## 1326                                                                
## 1327                                                                
## 1328                                                                
## 1329                                                       Dana Cook
## 1330                                                                
## 1331                                                                
## 1332                                                                
## 1333                                                    Brandy Hardy
## 1334                                                                
## 1335                                                                
## 1336                                                                
## 1337                                                Tiffany A Wright
## 1338                                                                
## 1339                                                                
## 1340                                                                
## 1341                                                 Dyamond Jackson
## 1342                                                                
## 1343                                                                
## 1344                                                                
## 1345                                           Alexis Gilliam Lerner
## 1346                                                                
## 1347                                                                
## 1348                                                                
## 1349                                                Tiffany Sheppard
## 1350                                                                
## 1351                                                                
## 1352                                                                
## 1353                                                  Tiara Peterkin
## 1354                                                                
## 1355                                                                
## 1356                                                                
## 1357                                            Monique Nicole Simon
## 1358                                                                
## 1359                                                                
## 1360                                                                
## 1361                                                 Jessica Harding
## 1362                                                                
## 1363                                                                
## 1364                                                                
## 1365                                                      Evan Davis
## 1366                                                                
## 1367                                                                
## 1368                                                                
## 1369                                               Abigail Makepeace
## 1370                                                                
## 1371                                                                
## 1372                                                                
## 1373                                              Jacinta Brown-Wade
## 1374                                                                
## 1375                                                                
## 1376                                                                
## 1377              Reshana Watson | Couples And Individuals Therapist
## 1378                                                                
## 1379                                                                
## 1380                                                                
## 1381                                                     Renee Curry
## 1382                                                                
## 1383                                                                
## 1384                                                                
## 1385                                            Monique Nicole Simon
## 1386                                                                
## 1387                                                                
## 1388                                                                
## 1389                                                   Megan Stanley
## 1390                                                                
## 1391                                                                
## 1392                                                                
## 1393                                               Traniece Stephens
## 1394                                                                
## 1395                                                                
## 1396                                                                
## 1397                                             Shalonda K Crawford
## 1398                                                                
## 1399                                                                
## 1400                                                                
## 1401                                                   Talesha Payne
## 1402                                                                
## 1403                                                                
## 1404                                                                
## 1405                                       Veronica D Swink-Williams
## 1406                                                                
## 1407                                                                
## 1408                                                                
## 1409                         SC@Embodied Healing Counseling Services
## 1410                                                                
## 1411                                                                
## 1412                                                                
## 1413                                                  Mariane Makkar
## 1414                                                                
## 1415                                                                
## 1416                                                                
## 1417                                                  Khana Lacewell
## 1418                                                                
## 1419                                                                
## 1420                                                                
## 1421                                                   Tamika Torres
## 1422                                                                
## 1423                                                                
## 1424                                                                
## 1425                  Expansive Therapy (Convenient, Online Therapy)
## 1426                                                                
## 1427                                                                
## 1428                                                                
## 1429                                              Shaquita R Junious
## 1430                                                                
## 1431                                                                
## 1432                                                                
## 1433                                                    Jerel L. Lee
## 1434                                                                
## 1435                                                                
## 1436                                                                
## 1437                                                    Brandy Hardy
## 1438                                                                
## 1439                                                                
## 1440                                                                
## 1441                                                   Crystal Young
## 1442                                                                
## 1443                                                                
## 1444                                                                
## 1445                                                 Jessica Harding
## 1446                                                                
## 1447                                                                
## 1448                                                                
## 1449                                                 DeMonta Whiting
## 1450                                                                
## 1451                                                                
## 1452                                                                
## 1453                  Expansive Therapy (Convenient, Online Therapy)
## 1454                                                                
## 1455                                                                
## 1456                                                                
## 1457                                                      Evan Davis
## 1458                                                                
## 1459                                                                
## 1460                                                                
## 1461                                                     Genia Young
## 1462                                                                
## 1463                                                                
## 1464                                                                
## 1465                                                     Taia Willis
## 1466                                                                
## 1467                                                                
## 1468                                                                
## 1469                                                  Tristan Taylor
## 1470                                                                
## 1471                                                                
## 1472                                                                
## 1473                                           Alexis Gilliam Lerner
## 1474                                                                
## 1475                                                                
## 1476                                                                
## 1477                                               Margarette Lathan
## 1478                                                                
## 1479                                                                
## 1480                                                                
## 1481                                                   Eka S. Childs
## 1482                                                                
## 1483                                                                
## 1484                                                                
## 1485                                               Abigail Makepeace
## 1486                                                                
## 1487                                                                
## 1488                                                                
## 1489                                                    Samia Yesufu
## 1490                                                                
## 1491                                                                
## 1492                                                                
## 1493                                     Dr.JM Licensed Psychologist
## 1494                                                                
## 1495                                                                
## 1496                                                                
## 1497                                                    Kayla Whaley
## 1498                                                                
## 1499                                                                
## 1500                                                                
## 1501                                                  Vernon Proctor
## 1502                                                                
## 1503                                                                
## 1504                                                                
## 1505                                                  Troi Jefferson
## 1506                                                                
## 1507                                                                
## 1508                                                                
## 1509                                                 Krystal Johnson
## 1510                                                                
## 1511                                                                
## 1512                                                                
## 1513                                                   Tanisha Tatum
## 1514                                                                
## 1515                                                                
## 1516                                                                
## 1517                                                  Jamillah Pargo
## 1518                                                                
## 1519                                                                
## 1520                                                                
## 1521                                     Dr.JM Licensed Psychologist
## 1522                                                                
## 1523                                                                
## 1524                                                                
## 1525                                                  Jamillah Pargo
## 1526                                                                
## 1527                                                                
## 1528                                                                
## 1529                                                    Samia Yesufu
## 1530                                                                
## 1531                                                                
## 1532                                                                
## 1533                                                    Kayla Whaley
## 1534                                                                
## 1535                                                                
## 1536                                                                
## 1537                    Perfecting Selflove (Lester Renee Jones Jr.)
## 1538                                                                
## 1539                                                                
## 1540                                                                
## 1541                                             Thomas Isaac Castro
## 1542                                                                
## 1543                                                                
## 1544                                                                
## 1545             Mia Blakely-Brown Teletherapy Throughout California
## 1546                                                                
## 1547                                                                
## 1548                                                                
## 1549                                                 Marlene V Jaffe
## 1550                                                                
## 1551                                                                
## 1552                                                                
## 1553                                 K&S Therapeutic Services, Inc. 
## 1554                                                                
## 1555                                                                
## 1556                                                                
## 1557                                                   David Ibrahim
## 1558                                                                
## 1559                                                                
## 1560                                                                
## 1561                                               Terence Westbrook
## 1562                                                                
## 1563                                                                
## 1564                                                                
## 1565                           Heaven Inspired Christian Counseling 
## 1566                                                                
## 1567                                                                
## 1568                                                                
## 1569               Dedicato Treatment Center (Intensive Outpatient) 
## 1570                                                                
## 1571                                                                
## 1572                                                                
## 1573                                   Thelese Consulting Group, LLC
## 1574                                                                
## 1575                                                                
## 1576                                                                
## 1577                                                  Esiete Afework
## 1578                                                                
## 1579                                                                
## 1580                                                                
## 1581                                                     Amber Brown
## 1582                                                                
## 1583                                                                
## 1584                                                                
## 1585                                                      April Iser
## 1586                                                                
## 1587                                                                
## 1588                                                                
## 1589                                                   Keith McGowen
## 1590                                                                
## 1591                                                                
## 1592                                                                
## 1593                                       Marika Gonzalez Reznichek
## 1594                                                                
## 1595                                                                
## 1596                                                                
## 1597                                  Black Canvas Wholistic Therapy
## 1598                                                                
## 1599                                                                
## 1600                                                                
## 1601                                                 Cynthia Langley
## 1602                                                                
## 1603                                                                
## 1604                                                                
## 1605                                               Technique Therapy
## 1606                                                                
## 1607                                                                
## 1608                                                                
## 1609                           Heaven Inspired Christian Counseling 
## 1610                                                                
## 1611                                                                
## 1612                                                                
## 1613                                   Thelese Consulting Group, LLC
## 1614                                                                
## 1615                                                                
## 1616                                                                
## 1617                                                    Kyra Sanchez
## 1618                                                                
## 1619                                                                
## 1620                                                                
## 1621                                             Lynn Denise Barnard
## 1622                                                                
## 1623                                                                
## 1624                                                                
## 1625                                                   Asia McCready
## 1626                                                                
## 1627                                                                
## 1628                                                                
## 1629               Dedicato Treatment Center (Intensive Outpatient) 
## 1630                                                                
## 1631                                                                
## 1632                                                                
## 1633                                  Black Canvas Wholistic Therapy
## 1634                                                                
## 1635                                                                
## 1636                                                                
## 1637                                                  Deanne Samuels
## 1638                                                                
## 1639                                                                
## 1640                                                                
## 1641                                                     Amber Brown
## 1642                                                                
## 1643                                                                
## 1644                                                                
## 1645                                Healing Collective Therapy Group
## 1646                                                                
## 1647                                                                
## 1648                                                                
## 1649                                                      April Iser
## 1650                                                                
## 1651                                                                
## 1652                                                                
## 1653                                                   Buffy Fermino
## 1654                                                                
## 1655                                                                
## 1656                                                                
## 1657                                                   Jamal L Jones
## 1658                                                                
## 1659                                                                
## 1660                                                                
## 1661                                                    Noelle James
## 1662                                                                
## 1663                                                                
## 1664                                                                
## 1665                                                      Feyi Momoh
## 1666                                                                
## 1667                                                                
## 1668                                                                
## 1669                                   Janice R. Miles Sex Therapist
## 1670                                                                
## 1671                                                                
## 1672                                                                
## 1673                                                   Phillip Jones
## 1674                                                                
## 1675                                                                
## 1676                                                                
## 1677                                                  Shemetra James
## 1678                                                                
## 1679                                                                
## 1680                                                                
## 1681                                                 Lorna G Gregory
## 1682                                                                
## 1683                                                                
## 1684                                                                
## 1685                                                   Buffy Fermino
## 1686                                                                
## 1687                                                                
## 1688                                                                
## 1689                                        WJ Healing Collaborative
## 1690                                                                
## 1691                                                                
## 1692                                                                
## 1693                                                  Alton Carswell
## 1694                                                                
## 1695                                                                
## 1696                                                                
## 1697                                                  Tyree Griffith
## 1698                                                                
## 1699                                                                
## 1700                                                                
## 1701                                                 Moniecia Walker
## 1702                                                                
## 1703                                                                
## 1704                                                                
## 1705                                    The Core Counseling Services
## 1706                                                                
## 1707                                                                
## 1708                                                                
## 1709                                                   Phillip Jones
## 1710                                                                
## 1711                                                                
## 1712                                                                
## 1713                                                   Jamal L Jones
## 1714                                                                
## 1715                                                                
## 1716                                                                
## 1717                                                    Noelle James
## 1718                                                                
## 1719                                                                
## 1720                                                                
## 1721                                                Dr. Raquel Henry
## 1722                                                                
## 1723                                                                
## 1724                                                                
## 1725                                                 Arthur Streeter
## 1726                                                                
## 1727                                                                
## 1728                                                                
## 1729                                              Denise Billingsley
## 1730                                                                
## 1731                                                                
## 1732                                                                
## 1733                                      Tonya Washington-Hendricks
## 1734                                                                
## 1735                                                                
## 1736                                                                
## 1737                                                      Feyi Momoh
## 1738                                                                
## 1739                                                                
## 1740                                                                
## 1741               Infinite Alignments Therapy & Consulting Services
## 1742                                                                
## 1743                                                                
## 1744                                                                
## 1745                                               Dr. Shemya Vaughn
## 1746                                                                
## 1747                                                                
## 1748                                                                
## 1749                                                   Francis David
## 1750                                                                
## 1751                                                                
## 1752                                                                
## 1753                                                  Erica Valdivia
## 1754                                                                
## 1755                                                                
## 1756                                                                
## 1757                             Ashley Herron | Christian Counselor
## 1758                                                                
## 1759                                                                
## 1760                                                                
## 1761                                                   Lauren Garcia
## 1762                                                                
## 1763                                                                
## 1764                                                                
## 1765                                                   Carol M. Lazo
## 1766                                                                
## 1767                                                                
## 1768                                                                
## 1769                                                 Tamika M Morris
## 1770                                                                
## 1771                                                                
## 1772                                                                
## 1773                                                   Kandace Brown
## 1774                                                                
## 1775                                                                
## 1776                                                                
## 1777                                                Anna Jones, LMFT
## 1778                                                                
## 1779                                                                
## 1780                                                                
## 1781              Perfectly Imperfect Counseling & Creative Concepts
## 1782                                                                
## 1783                                                                
## 1784                                                                
## 1785                                                   Zeruah Reedom
## 1786                                                                
## 1787                                                                
## 1788                                                                
## 1789                                             iVibe Psychotherapy
## 1790                                                                
## 1791                                                                
## 1792                                                                
## 1793                                                    Kevin Graves
## 1794                                                                
## 1795                                                                
## 1796                                                                
## 1797                                         Keturah McClendon Baker
## 1798                                                                
## 1799                                                                
## 1800                                                                
## 1801                                 Saguaro Family Counseling, Inc.
## 1802                                                                
## 1803                                                                
## 1804                                                                
## 1805                                             Stephanie J Hubbard
## 1806                                                                
## 1807                                                                
## 1808                                                                
## 1809                                                Vincent Lombardi
## 1810                                                                
## 1811                                                                
## 1812                                                                
## 1813                                                    Tiffany Ramm
## 1814                                                                
## 1815                                                                
## 1816                                                                
## 1817                                               Dr. Kristine Kepp
## 1818                                                                
## 1819                                                                
## 1820                                                                
## 1821                                                  Princess Walsh
## 1822                                                                
## 1823                                                                
## 1824                                                                
## 1825                                        Julia Galaudet Psyd Lcsw
## 1826                                                                
## 1827                                                                
## 1828                                                                
## 1829                                                Douglas L Gosney
## 1830                                                                
## 1831                                                                
## 1832                                                                
## 1833                                                     Ray Cochran
## 1834                                                                
## 1835                                                                
## 1836                                                                
## 1837                                                Anton Yanagisawa
## 1838                                                                
## 1839                                                                
## 1840                                                                
## 1841                 Kongit Farrell - Couples Counseling Sex Therapy
## 1842                                                                
## 1843                                                                
## 1844                                                                
## 1845                                            Dr. Crystal Clements
## 1846                                                                
## 1847                                                                
## 1848                                                                
## 1849                                                     David Berón
## 1850                                                                
## 1851                                                                
## 1852                                                                
## 1853                                               Dr. Candace Girod
## 1854                                                                
## 1855                                                                
## 1856                                                                
## 1857                                    Eclectic Minds Therapy Group
## 1858                                                                
## 1859                                                                
## 1860                                                                
## 1861                                                   Sarah Mireles
## 1862                                                                
## 1863                                                                
## 1864                                                                
## 1865                                              Morgan Kirkpatrick
## 1866                                                                
## 1867                                                                
## 1868                                                                
## 1869                                              Nora J. Baladerian
## 1870                                                                
## 1871                                                                
## 1872                                                                
## 1873                                                  Peter R Getoff
## 1874                                                                
## 1875                                                                
## 1876                                                                
## 1877                                                   Anthony Sykes
## 1878                                                                
## 1879                                                                
## 1880                                                                
## 1881                                                      Terri Doby
## 1882                                                                
## 1883                                                                
## 1884                                                                
## 1885                                                Monica A Ellison
## 1886                                                                
## 1887                                                                
## 1888                                                                
## 1889                                              DeYana M Blacksher
## 1890                                                                
## 1891                                                                
## 1892                                                                
## 1893                                                 Theodore Burnes
## 1894                                                                
## 1895                                                                
## 1896                                                                
## 1897                                            Ivette Somoza Arroyo
## 1898                                                                
## 1899                                                                
## 1900                                                                
## 1901                                                Anton Yanagisawa
## 1902                                                                
## 1903                                                                
## 1904                                                                
## 1905                                                   Debra J Myers
## 1906                                                                
## 1907                                                                
## 1908                                                                
## 1909                                             Roland A Frauchiger
## 1910                                                                
## 1911                                                                
## 1912                                                                
## 1913                                      Judith Crane Psychotherapy
## 1914                                                                
## 1915                                                                
## 1916                                                                
## 1917                                              Bobby Jerome Davis
## 1918                                                                
## 1919                                                                
## 1920                                                                
## 1921                                                    Diana Rivera
## 1922                                                                
## 1923                                                                
## 1924                                                                
## 1925                                                  Carolina Louis
## 1926                                                                
## 1927                                                                
## 1928                                                                
## 1929                                                  Peter R Getoff
## 1930                                                                
## 1931                                                                
## 1932                                                                
## 1933                                                Douglas L Gosney
## 1934                                                                
## 1935                                                                
## 1936                                                                
## 1937                                                   Amanda Neiman
## 1938                                                                
## 1939                                                                
## 1940                                                                
## 1941                                             Elana M Clark-Faler
## 1942                                                                
## 1943                                                                
## 1944                                                                
## 1945                                                 Dr. Jadah Petty
## 1946                                                                
## 1947                                                                
## 1948                                                                
## 1949                                                Jenna Richardson
## 1950                                                                
## 1951                                                                
## 1952                                                                
## 1953                                                   Loren M. Hill
## 1954                                                                
## 1955                                                                
## 1956                                                                
## 1957                                                    Tiffany Ramm
## 1958                                                                
## 1959                                                                
## 1960                                                                
## 1961                                              All About Adoption
## 1962                                                                
## 1963                                                                
## 1964                                                                
## 1965                                            Ricardo Patrick Peña
## 1966                                                                
## 1967                                                                
## 1968                                                                
## 1969                                                   Anthony Sykes
## 1970                                                                
## 1971                                                                
## 1972                                                                
## 1973                                                 Maricsa S Evans
## 1974                                                                
## 1975                                                                
## 1976                                                                
## 1977                                                   Lauren Kerwin
## 1978                                                                
## 1979                                                                
## 1980                                                                
## 1981                                                  Ming Loong Teo
## 1982                                                                
## 1983                                                                
## 1984                                                                
## 1985                                      S C (Stacy-Colleen) Nameth
## 1986                                                                
## 1987                                                                
## 1988                                                                
## 1989                                    Eclectic Minds Therapy Group
## 1990                                                                
## 1991                                                                
## 1992                                                                
## 1993                                                   Daishea Poole
## 1994                                                                
## 1995                                                                
## 1996                                                                
## 1997                                                   Jodi Scofield
## 1998                                                                
## 1999                                                                
## 2000                                                                
## 2001                                                    Dave McGuire
## 2002                                                                
## 2003                                                                
## 2004                                                                
## 2005                                                  Hannah Khoddam
## 2006                                                                
## 2007                                                                
## 2008                                                                
## 2009                                                Candace E. Young
## 2010                                                                
## 2011                                                                
## 2012                                                                
## 2013                                                  Kristin Beech 
## 2014                                                                
## 2015                                                                
## 2016                                                                
## 2017                                                    Tiffany Ramm
## 2018                                                                
## 2019                                                                
## 2020                                                                
## 2021                                         Keturah McClendon Baker
## 2022                                                                
## 2023                                                                
## 2024                                                                
## 2025                                                   Shirl Kelemer
## 2026                                                                
## 2027                                                                
## 2028                                                                
## 2029                                                     Ray Cochran
## 2030                                                                
## 2031                                                                
## 2032                                                                
## 2033                                                   Anthony Sykes
## 2034                                                                
## 2035                                                                
## 2036                                                                
## 2037                                        Julia Galaudet Psyd Lcsw
## 2038                                                                
## 2039                                                                
## 2040                                                                
## 2041                                   Dr. Howard C. Samuels Therapy
## 2042                                                                
## 2043                                                                
## 2044                                                                
## 2045                                                   Kaela Stambor
## 2046                                                                
## 2047                                                                
## 2048                                                                
## 2049                                                Maxine M. Hughes
## 2050                                                                
## 2051                                                                
## 2052                                                                
## 2053                      MOVN Psychotherapy and Embodiment Practice
## 2054                                                                
## 2055                                                                
## 2056                                                                
## 2057                                                     Sylvia Turk
## 2058                                                                
## 2059                                                                
## 2060                                                                
## 2061                                                   Nailah French
## 2062                                                                
## 2063                                                                
## 2064                                                                
## 2065                                               Dr. Candace Girod
## 2066                                                                
## 2067                                                                
## 2068                                                                
## 2069                                                   Steven Reigns
## 2070                                                                
## 2071                                                                
## 2072                                                                
## 2073                                                   Londyn Miller
## 2074                                                                
## 2075                                                                
## 2076                                                                
## 2077                                                    Laura Minero
## 2078                                                                
## 2079                                                                
## 2080                                                                
## 2081                                                    Fredrick Edo
## 2082                                                                
## 2083                                                                
## 2084                                                                
## 2085                                 Saguaro Family Counseling, Inc.
## 2086                                                                
## 2087                                                                
## 2088                                                                
## 2089                                       Katherine Rose Peters Phd
## 2090                                                                
## 2091                                                                
## 2092                                                                
## 2093                                                Candace E. Young
## 2094                                                                
## 2095                                                                
## 2096                                                                
## 2097                                                       Carl King
## 2098                                                                
## 2099                                                                
## 2100                                                                
## 2101                                                   Nadia Alvarez
## 2102                                                                
## 2103                                                                
## 2104                                                                
## 2105                                                  Peter R Getoff
## 2106                                                                
## 2107                                                                
## 2108                                                                
## 2109                                          Patience Cummings-John
## 2110                                                                
## 2111                                                                
## 2112                                                                
## 2113                                               Patricia Stephens
## 2114                                                                
## 2115                                                                
## 2116                                                                
## 2117                                                   James H Cones
## 2118                                                                
## 2119                                                                
## 2120                                                                
## 2121                                       Jennifer Lauren Arceneaux
## 2122                                                                
## 2123                                                                
## 2124                                                                
## 2125                                                   Elaine Kaback
## 2126                                                                
## 2127                                                                
## 2128                                                                
## 2129                                                  Tiffany Lowery
## 2130                                                                
## 2131                                                                
## 2132                                                                
## 2133                                                 Rochelle Rainey
## 2134                                                                
## 2135                                                                
## 2136                                                                
## 2137                                                    Aaron Aviera
## 2138                                                                
## 2139                                                                
## 2140                                                                
## 2141                                                 Ellie Zarrabian
## 2142                                                                
## 2143                                                                
## 2144                                                                
## 2145                            Dr. Wendy Schwartz O'Connor & Assoc.
## 2146                                                                
## 2147                                                                
## 2148                                                                
## 2149                                                   Steven Reigns
## 2150                                                                
## 2151                                                                
## 2152                                                                
## 2153                                                   Gabrey Milner
## 2154                                                                
## 2155                                                                
## 2156                                                                
## 2157                                                Areli Valenzuela
## 2158                                                                
## 2159                                                                
## 2160                                                                
## 2161                                             Dr. Jordyn Trockman
## 2162                                                                
## 2163                                                                
## 2164                                                                
## 2165                                                    Donika Brown
## 2166                                                                
## 2167                                                                
## 2168                                                                
## 2169                                                     Vimmi Jaggi
## 2170                                                                
## 2171                                                                
## 2172                                                                
## 2173                                              Nora J. Baladerian
## 2174                                                                
## 2175                                                                
## 2176                                                                
## 2177                                                  Caroline Tudor
## 2178                                                                
## 2179                                                                
## 2180                                                                
## 2181                      MOVN Psychotherapy and Embodiment Practice
## 2182                                                                
## 2183                                                                
## 2184                                                                
## 2185                                      Judith Crane Psychotherapy
## 2186                                                                
## 2187                                                                
## 2188                                                                
## 2189                                                   Daishea Poole
## 2190                                                                
## 2191                                                                
## 2192                                                                
## 2193                                                   Mark Winitsky
## 2194                                                                
## 2195                                                                
## 2196                                                                
## 2197                                                 Theodore Burnes
## 2198                                                                
## 2199                                                                
## 2200                                                                
## 2201                                          Esther Dreifuss-Kattan
## 2202                                                                
## 2203                                                                
## 2204                                                                
## 2205                                                Candace E. Young
## 2206                                                                
## 2207                                                                
## 2208                                                                
## 2209                                             Janein Chavez, LMFT
## 2210                                                                
## 2211                                                                
## 2212                                                                
## 2213                                                  Julisa Morales
## 2214                                                                
## 2215                                                                
## 2216                                                                
## 2217                                                     Ray Cochran
## 2218                                                                
## 2219                                                                
## 2220                                                                
## 2221                                                  Tiffany Lowery
## 2222                                                                
## 2223                                                                
## 2224                                                                
## 2225                       Alcohol and Drug Recovery Services (ADRS)
## 2226                                                                
## 2227                                                                
## 2228                                                                
## 2229                          Kongit Farrell - Premarital Counseling
## 2230                                                                
## 2231                                                                
## 2232                                                                
## 2233                                       Jennifer Lauren Arceneaux
## 2234                                                                
## 2235                                                                
## 2236                                                                
## 2237                                           Mary Tarry White Emdr
## 2238                                                                
## 2239                                                                
## 2240                                                                
## 2241                                                   Nailah French
## 2242                                                                
## 2243                                                                
## 2244                                                                
## 2245                                           Christina Marie Ortiz
## 2246                                                                
## 2247                                                                
## 2248                                                                
## 2249                                                  Julisa Morales
## 2250                                                                
## 2251                                                                
## 2252                                                                
## 2253                                                  Ashley Bradley
## 2254                                                                
## 2255                                                                
## 2256                                                                
## 2257                                 Saguaro Family Counseling, Inc.
## 2258                                                                
## 2259                                                                
## 2260                                                                
## 2261                                          Patience Cummings-John
## 2262                                                                
## 2263                                                                
## 2264                                                                
## 2265                                     Edward Garren, M.A., M.F.T.
## 2266                                                                
## 2267                                                                
## 2268                                                                
## 2269                                             Janet Medrano Reyes
## 2270                                                                
## 2271                                                                
## 2272                                                                
## 2273                          Kongit Farrell - Premarital Counseling
## 2274                                                                
## 2275                                                                
## 2276                                                                
## 2277                            Dr. Wendy Schwartz O'Connor & Assoc.
## 2278                                                                
## 2279                                                                
## 2280                                                                
## 2281                                                  Sharma Bennett
## 2282                                                                
## 2283                                                                
## 2284                                                                
## 2285                                              All About Adoption
## 2286                                                                
## 2287                                                                
## 2288                                                                
## 2289               The Resiliency Shoppe, Marriage & Family Therapy 
## 2290                                                                
## 2291                                                                
## 2292                                                                
## 2293                                                    Bree Jenkins
## 2294                                                                
## 2295                                                                
## 2296                                                                
## 2297                                               Chante D. DeLoach
## 2298                                                                
## 2299                                                                
## 2300                                                                
## 2301                                                     Ray Cochran
## 2302                                                                
## 2303                                                                
## 2304                                                                
## 2305                                              DeYana M Blacksher
## 2306                                                                
## 2307                                                                
## 2308                                                                
## 2309                                                  Jennifer Noble
## 2310                                                                
## 2311                                                                
## 2312                                                                
## 2313                                                 Brian X Dunphey
## 2314                                                                
## 2315                                                                
## 2316                                                                
## 2317                                                     Sylvia Turk
## 2318                                                                
## 2319                                                                
## 2320                                                                
## 2321                                 Saguaro Family Counseling, Inc.
## 2322                                                                
## 2323                                                                
## 2324                                                                
## 2325                                                 Dr. Tony Madril
## 2326                                                                
## 2327                                                                
## 2328                                                                
## 2329                              Stacey Tannenbaum-McIver, L.M.F.T.
## 2330                                                                
## 2331                                                                
## 2332                                                                
## 2333                                                   James H Cones
## 2334                                                                
## 2335                                                                
## 2336                                                                
## 2337                                                Michael D Hughes
## 2338                                                                
## 2339                                                                
## 2340                                                                
## 2341                                                   Kristina Hall
## 2342                                                                
## 2343                                                                
## 2344                                                                
## 2345                                                    Kevin Graves
## 2346                                                                
## 2347                                                                
## 2348                                                                
## 2349                                                     Lisa Dozier
## 2350                                                                
## 2351                                                                
## 2352                                                                
## 2353                                                   Anthony Sykes
## 2354                                                                
## 2355                                                                
## 2356                                                                
## 2357                                                   Nailah French
## 2358                                                                
## 2359                                                                
## 2360                                                                
## 2361                                                  Krista R. Page
## 2362                                                                
## 2363                                                                
## 2364                                                                
## 2365                                                   Londyn Miller
## 2366                                                                
## 2367                                                                
## 2368                                                                
## 2369                                                   Sense Of Self
## 2370                                                                
## 2371                                                                
## 2372                                                                
## 2373                                         Keturah McClendon Baker
## 2374                                                                
## 2375                                                                
## 2376                                                                
## 2377                                            Ivette Somoza Arroyo
## 2378                                                                
## 2379                                                                
## 2380                                                                
## 2381                                                 Sylvanna Vargas
## 2382                                                                
## 2383                                                                
## 2384                                                                
## 2385                                                   Vanessa Cantu
## 2386                                                                
## 2387                                                                
## 2388                                                                
## 2389                       Alcohol and Drug Recovery Services (ADRS)
## 2390                                                                
## 2391                                                                
## 2392                                                                
## 2393                                                      Terri Doby
## 2394                                                                
## 2395                                                                
## 2396                                                                
## 2397                                   Dr. Howard C. Samuels Therapy
## 2398                                                                
## 2399                                                                
## 2400                                                                
## 2401                                                Joan I Rosenberg
## 2402                                                                
## 2403                                                                
## 2404                                                                
## 2405                                                     David Berón
## 2406                                                                
## 2407                                                                
## 2408                                                                
## 2409                                                  Kristin Beech 
## 2410                                                                
## 2411                                                                
## 2412                                                                
## 2413                                                     Michael Nee
## 2414                                                                
## 2415                                                                
## 2416                                                                
## 2417                                                   Debra J Myers
## 2418                                                                
## 2419                                                                
## 2420                                                                
## 2421                                           Mary Tarry White Emdr
## 2422                                                                
## 2423                                                                
## 2424                                                                
## 2425                                                   Steven Reigns
## 2426                                                                
## 2427                                                                
## 2428                                                                
## 2429                       EMDR Trauma Therapists for Teens & Adults
## 2430                                                                
## 2431                                                                
## 2432                                                                
## 2433                                                Vincent Lombardi
## 2434                                                                
## 2435                                                                
## 2436                                                                
## 2437                                             iVibe Psychotherapy
## 2438                                                                
## 2439                                                                
## 2440                                                                
## 2441                                                   Loren M. Hill
## 2442                                                                
## 2443                                                                
## 2444                                                                
## 2445                                                     Aaron Smith
## 2446                                                                
## 2447                                                                
## 2448                                                                
## 2449                                                    Stara Shakti
## 2450                                                                
## 2451                                                                
## 2452                                                                
## 2453                                               Alike Z. Chandler
## 2454                                                                
## 2455                                                                
## 2456                                                                
## 2457                                   Dr. Howard C. Samuels Therapy
## 2458                                                                
## 2459                                                                
## 2460                                                                
## 2461                                             Dr. Tierra T. Ellis
## 2462                                                                
## 2463                                                                
## 2464                                                                
## 2465                                                 Maricsa S Evans
## 2466                                                                
## 2467                                                                
## 2468                                                                
## 2469                                                 Dr. Jadah Petty
## 2470                                                                
## 2471                                                                
## 2472                                                                
## 2473                                                Areli Valenzuela
## 2474                                                                
## 2475                                                                
## 2476                                                                
## 2477                                                  Julisa Morales
## 2478                                                                
## 2479                                                                
## 2480                                                                
## 2481                                                   Gabrey Milner
## 2482                                                                
## 2483                                                                
## 2484                                                                
## 2485                                Kelly Walker Online Therapy Only
## 2486                                                                
## 2487                                                                
## 2488                                                                
## 2489                                            Alicia 'logan' Barrs
## 2490                                                                
## 2491                                                                
## 2492                                                                
## 2493                                                   Jennifer Holt
## 2494                                                                
## 2495                                                                
## 2496                                                                
## 2497                                                    Paola Bailey
## 2498                                                                
## 2499                                                                
## 2500                                                                
## 2501                                                     Jamal Adams
## 2502                                                                
## 2503                                                                
## 2504                                                                
## 2505                                               Renaldo Strayhorn
## 2506                                                                
## 2507                                                                
## 2508                                                                
## 2509                                                    Micha Thomas
## 2510                                                                
## 2511                                                                
## 2512                                                                
## 2513                                                      Shuna Ball
## 2514                                                                
## 2515                                                                
## 2516                                                                
## 2517                                        Emmada Psychology Center
## 2518                                                                
## 2519                                                                
## 2520                                                                
## 2521                                                   Karen Wulfson
## 2522                                                                
## 2523                                                                
## 2524                                                                
## 2525                                                 Keisha C. White
## 2526                                                                
## 2527                                                                
## 2528                                                                
## 2529                                                       Dr. Pekti
## 2530                                                                
## 2531                                                                
## 2532                                                                
## 2533                                                  Martin A Perea
## 2534                                                                
## 2535                                                                
## 2536                                                                
## 2537                                                    Nazare Magaz
## 2538                                                                
## 2539                                                                
## 2540                                                                
## 2541                                            Dr. Kelly A Williams
## 2542                                                                
## 2543                                                                
## 2544                                                                
## 2545                                                    Allison Clay
## 2546                                                                
## 2547                                                                
## 2548                                                                
## 2549                                              Gay Therapy Center
## 2550                                                                
## 2551                                                                
## 2552                                                                
## 2553                         California Psychological Services, Inc.
## 2554                                                                
## 2555                                                                
## 2556                                                                
## 2557                          Kongit Farrell - Premarital Counseling
## 2558                                                                
## 2559                                                                
## 2560                                                                
## 2561                                                      Shuna Ball
## 2562                                                                
## 2563                                                                
## 2564                                                                
## 2565                                                    Paola Bailey
## 2566                                                                
## 2567                                                                
## 2568                                                                
## 2569                                               Renaldo Strayhorn
## 2570                                                                
## 2571                                                                
## 2572                                                                
## 2573                                              Gay Therapy Center
## 2574                                                                
## 2575                                                                
## 2576                                                                
## 2577                           Robin Gans Psy.D A Psychological Corp
## 2578                                                                
## 2579                                                                
## 2580                                                                
## 2581                                       Dr. Sammie Williams, PsyD
## 2582                                                                
## 2583                                                                
## 2584                                                                
## 2585                                                     Rudy Castro
## 2586                                                                
## 2587                                                                
## 2588                                                                
## 2589                                             Faye Ingrid Mandell
## 2590                                                                
## 2591                                                                
## 2592                                                                
## 2593                           The Saturday Center for Psychotherapy
## 2594                                                                
## 2595                                                                
## 2596                                                                
## 2597                                        Brigid Gorski Rosebraugh
## 2598                                                                
## 2599                                                                
## 2600                                                                
## 2601                                        Harris Family Counseling
## 2602                                                                
## 2603                                                                
## 2604                                                                
## 2605                                                  Julie Ann Gray
## 2606                                                                
## 2607                                                                
## 2608                                                                
## 2609                                                    Diana Taylor
## 2610                                                                
## 2611                                                                
## 2612                                                                
## 2613                   SistahPeace(tm) ReShaping(tm) WellBalance(tm)
## 2614                                                                
## 2615                                                                
## 2616                                                                
## 2617                                                Paulette Douglas
## 2618                                                                
## 2619                                                                
## 2620                                                                
## 2621                                                  Sheila Traviss
## 2622                                                                
## 2623                                                                
## 2624                                                                
## 2625                                                   Amanda Denham
## 2626                                                                
## 2627                                                                
## 2628                                                                
## 2629                                 Heal Together Wellness Services
## 2630                                                                
## 2631                                                                
## 2632                                                                
## 2633                                         Brandi Camille Bakewell
## 2634                                                                
## 2635                                                                
## 2636                                                                
## 2637                                                 A. Shaye, Ph.D.
## 2638                                                                
## 2639                                                                
## 2640                                                                
## 2641                                         Brandi Camille Bakewell
## 2642                                                                
## 2643                                                                
## 2644                                                                
## 2645                                                 A. Shaye, Ph.D.
## 2646                                                                
## 2647                                                                
## 2648                                                                
## 2649                                                Paulette Douglas
## 2650                                                                
## 2651                                                                
## 2652                                                                
## 2653                                                  Sheila Traviss
## 2654                                                                
## 2655                                                                
## 2656                                                                
## 2657                                        Brigid Gorski Rosebraugh
## 2658                                                                
## 2659                                                                
## 2660                                                                
## 2661                                                    Diana Taylor
## 2662                                                                
## 2663                                                                
## 2664                                                                
## 2665                                            Alexis Andrea Moreno
## 2666                                                                
## 2667                                                                
## 2668                                                                
## 2669                                             Jody Joshua Adewale
## 2670                                                                
## 2671                                                                
## 2672                                                                
## 2673                                        Gwen Harville-Washington
## 2674                                                                
## 2675                                                                
## 2676                                                                
## 2677                                            Yojana Veeramasuneni
## 2678                                                                
## 2679                                                                
## 2680                                                                
## 2681                                             Delores Picou, LMFT
## 2682                                                                
## 2683                                                                
## 2684                                                                
## 2685                                                    Amarri Simms
## 2686                                                                
## 2687                                                                
## 2688                                                                
## 2689                                         Margaret Avant Mitchell
## 2690                                                                
## 2691                                                                
## 2692                                                                
## 2693                                                  Darlene Lancer
## 2694                                                                
## 2695                                                                
## 2696                                                                
## 2697                                                    Gerard Paron
## 2698                                                                
## 2699                                                                
## 2700                                                                
## 2701                                                   MK Counseling
## 2702                                                                
## 2703                                                                
## 2704                                                                
## 2705                                              Jousline Savra MFT
## 2706                                                                
## 2707                                                                
## 2708                                                                
## 2709                                               Dr. Cassidy Blair
## 2710                                                                
## 2711                                                                
## 2712                                                                
## 2713                                                      Aron Sumii
## 2714                                                                
## 2715                                                                
## 2716                                                                
## 2717                                                  Veronica Abney
## 2718                                                                
## 2719                                                                
## 2720                                                                
## 2721                                             Jody Joshua Adewale
## 2722                                                                
## 2723                                                                
## 2724                                                                
## 2725                                            Yojana Veeramasuneni
## 2726                                                                
## 2727                                                                
## 2728                                                                
## 2729                                                  Veronica Abney
## 2730                                                                
## 2731                                                                
## 2732                                                                
## 2733                                                   MK Counseling
## 2734                                                                
## 2735                                                                
## 2736                                                                
## 2737                                              Arlen Keith Leight
## 2738                                                                
## 2739                                                                
## 2740                                                                
## 2741                                                      Aron Sumii
## 2742                                                                
## 2743                                                                
## 2744                                                                
## 2745                                             Delores Picou, LMFT
## 2746                                                                
## 2747                                                                
## 2748                                                                
## 2749                                                  Bianca DeGroat
## 2750                                                                
## 2751                                                                
## 2752                                                                
## 2753                                                    Gerard Paron
## 2754                                                                
## 2755                                                                
## 2756                                                                
## 2757                     Eve's Place of Peace, Center for Well-Being
## 2758                                                                
## 2759                                                                
## 2760                                                                
## 2761                                                   Latoya Boston
## 2762                                                                
## 2763                                                                
## 2764                                                                
## 2765                                             Monica Diane Mayall
## 2766                                                                
## 2767                                                                
## 2768                                                                
## 2769                                            Robert L. Mendelsohn
## 2770                                                                
## 2771                                                                
## 2772                                                                
## 2773                                                   Terrance Wolf
## 2774                                                                
## 2775                                                                
## 2776                                                                
## 2777                                             Desiree L. Reynolds
## 2778                                                                
## 2779                                                                
## 2780                                                                
## 2781                                                     Somi P. Han
## 2782                                                                
## 2783                                                                
## 2784                                                                
## 2785                        Eva Clay Sex And Relationship Specialist
## 2786                                                                
## 2787                                                                
## 2788                                                                
## 2789                                                   Inner Freedom
## 2790                                                                
## 2791                                                                
## 2792                                                                
## 2793                                                 Susan A Herbert
## 2794                                                                
## 2795                                                                
## 2796                                                                
## 2797                                                 Edlin Gutierrez
## 2798                                                                
## 2799                                                                
## 2800                                                                
## 2801                                              Elena Frances Bell
## 2802                                                                
## 2803                                                                
## 2804                                                                
## 2805                                        The Center of Resiliency
## 2806                                                                
## 2807                                                                
## 2808                                                                
## 2809                                          G Evelyn LeSure-Lester
## 2810                                                                
## 2811                                                                
## 2812                                                                
## 2813                                                     Maya DeNola
## 2814                                                                
## 2815                                                                
## 2816                                                                
## 2817                                            MVP Consulting Group
## 2818                                                                
## 2819                                                                
## 2820                                                                
## 2821                                            Healthy Mind Therapy
## 2822                                                                
## 2823                                                                
## 2824                                                                
## 2825                                                Alexander Dorsey
## 2826                                                                
## 2827                                                                
## 2828                                                                
## 2829                                          Daniela Yanet Alvarado
## 2830                                                                
## 2831                                                                
## 2832                                                                
## 2833                                                    Eric Adelman
## 2834                                                                
## 2835                                                                
## 2836                                                                
## 2837                                                 Edlin Gutierrez
## 2838                                                                
## 2839                                                                
## 2840                                                                
## 2841                                                     Aya Rasheed
## 2842                                                                
## 2843                                                                
## 2844                                                                
## 2845                                                 Dr. Mona Khaled
## 2846                                                                
## 2847                                                                
## 2848                                                                
## 2849                            Next Move Mental Health Agency, Inc.
## 2850                                                                
## 2851                                                                
## 2852                                                                
## 2853                                               Brooke Clavesilla
## 2854                                                                
## 2855                                                                
## 2856                                                                
## 2857                                       Vanessa R. Abernathy Psyd
## 2858                                                                
## 2859                                                                
## 2860                                                                
## 2861                                    Jamie Lynn Franklin-Lawrence
## 2862                                                                
## 2863                                                                
## 2864                                                                
## 2865                                                   Tamara Walden
## 2866                                                                
## 2867                                                                
## 2868                                                                
## 2869                             Love and Loss Therapeutic Services 
## 2870                                                                
## 2871                                                                
## 2872                                                                
## 2873                                                 Susan A Herbert
## 2874                                                                
## 2875                                                                
## 2876                                                                
## 2877                   Online Therapy | Jacqueline Ashley, DSW, LCSW
## 2878                                                                
## 2879                                                                
## 2880                                                                
## 2881                                                 Marquita Stokes
## 2882                                                                
## 2883                                                                
## 2884                                                                
## 2885                                                    Sarah Warren
## 2886                                                                
## 2887                                                                
## 2888                                                                
## 2889                                        The Center of Resiliency
## 2890                                                                
## 2891                                                                
## 2892                                                                
## 2893                                       Vanessa R. Abernathy Psyd
## 2894                                                                
## 2895                                                                
## 2896                                                                
## 2897                      Guiding Hope Individual and Family Therapy
## 2898                                                                
## 2899                                                                
## 2900                                                                
## 2901                                                  Renee Schwartz
## 2902                                                                
## 2903                                                                
## 2904                                                                
## 2905                                    Search and Create Counseling
## 2906                                                                
## 2907                                                                
## 2908                                                                
## 2909                                                     Che Johnson
## 2910                                                                
## 2911                                                                
## 2912                                                                
## 2913                                             Mary Linda Williams
## 2914                                                                
## 2915                                                                
## 2916                                                                
## 2917                                              Elena Frances Bell
## 2918                                                                
## 2919                                                                
## 2920                                                                
## 2921                                                     Maya DeNola
## 2922                                                                
## 2923                                                                
## 2924                                                                
## 2925                                                     Aya Rasheed
## 2926                                                                
## 2927                                                                
## 2928                                                                
## 2929                  #1 Psychological Testing & Evaluations Service
## 2930                                                                
## 2931                                                                
## 2932                                                                
## 2933                                                   Tamara Walden
## 2934                                                                
## 2935                                                                
## 2936                                                                
## 2937                                         Elizabeth Danielle Mead
## 2938                                                                
## 2939                                                                
## 2940                                                                
## 2941                                                Tyler Grant Daly
## 2942                                                                
## 2943                                                                
## 2944                                                                
## 2945                                           Awaken Therapy Center
## 2946                                                                
## 2947                                                                
## 2948                                                                
## 2949                                          Daniela Yanet Alvarado
## 2950                                                                
## 2951                                                                
## 2952                                                                
## 2953                                                 Dr. Mona Khaled
## 2954                                                                
## 2955                                                                
## 2956                                                                
## 2957                                               Brooke Clavesilla
## 2958                                                                
## 2959                                                                
## 2960                                                                
## 2961                                                     Maya DeNola
## 2962                                                                
## 2963                                                                
## 2964                                                                
## 2965                                                  Nicole Wallace
## 2966                                                                
## 2967                                                                
## 2968                                                                
## 2969                                                    Andrea Arias
## 2970                                                                
## 2971                                                                
## 2972                                                                
## 2973                                                      Kaci Smith
## 2974                                                                
## 2975                                                                
## 2976                                                                
## 2977                                                    Barney Rosen
## 2978                                                                
## 2979                                                                
## 2980                                                                
## 2981                                              Mind Thrive Health
## 2982                                                                
## 2983                                                                
## 2984                                                                
## 2985                              Valley Community Counseling Clinic
## 2986                                                                
## 2987                                                                
## 2988                                                                
## 2989                                             Zobra Hemphill-Ward
## 2990                                                                
## 2991                                                                
## 2992                                                                
## 2993                                                  Vanessa L Pezo
## 2994                                                                
## 2995                                                                
## 2996                                                                
## 2997                                                Facetyme Therapy
## 2998                                                                
## 2999                                                                
## 3000                                                                
## 3001              Dr. Cristina Dominguez, Mental & Performance, Inc.
## 3002                                                                
## 3003                                                                
## 3004                                                                
## 3005                                           Domonique Casper Shaw
## 3006                                                                
## 3007                                                                
## 3008                                                                
## 3009                                                  Rafinee Butler
## 3010                                                                
## 3011                                                                
## 3012                                                                
## 3013                                  Rupinder Sidhu Psychotherapist
## 3014                                                                
## 3015                                                                
## 3016                                                                
## 3017                                              Nishan Palaniyandi
## 3018                                                                
## 3019                                                                
## 3020                                                                
## 3021                                                    Tameko Jones
## 3022                                                                
## 3023                                                                
## 3024                                                                
## 3025                                      Shelly-Ann M Collins Rawle
## 3026                                                                
## 3027                                                                
## 3028                                                                
## 3029                                                 Suzzette Garcia
## 3030                                                                
## 3031                                                                
## 3032                                                                
## 3033                                                        Liz Cruz
## 3034                                                                
## 3035                                                                
## 3036                                                                
## 3037                                              Nicholle E. Lovely
## 3038                                                                
## 3039                                                                
## 3040                                                                
## 3041                                                        Liz Cruz
## 3042                                                                
## 3043                                                                
## 3044                                                                
## 3045                                                 Monique Kennedy
## 3046                                                                
## 3047                                                                
## 3048                                                                
## 3049                                                 Suzzette Garcia
## 3050                                                                
## 3051                                                                
## 3052                                                                
## 3053                                                    Kim E Fuller
## 3054                                                                
## 3055                                                                
## 3056                                                                
## 3057                                                    Andrea Arias
## 3058                                                                
## 3059                                                                
## 3060                                                                
## 3061                                             Zobra Hemphill-Ward
## 3062                                                                
## 3063                                                                
## 3064                                                                
## 3065                                              Mind Thrive Health
## 3066                                                                
## 3067                                                                
## 3068                                                                
## 3069                                                    Jas Tilghman
## 3070                                                                
## 3071                                                                
## 3072                                                                
## 3073                                              Nicholle E. Lovely
## 3074                                                                
## 3075                                                                
## 3076                                                                
## 3077                                                    Barney Rosen
## 3078                                                                
## 3079                                                                
## 3080                                                                
## 3081                 Yusra Coaching and Development by Sara Ghalaini
## 3082                                                                
## 3083                                                                
## 3084                                                                
## 3085                                               Patricia Gallegos
## 3086                                                                
## 3087                                                                
## 3088                                                                
## 3089                                                 Mayra A. Chavez
## 3090                                                                
## 3091                                                                
## 3092                                                                
## 3093                                                    Hope Therapy
## 3094                                                                
## 3095                                                                
## 3096                                                                
## 3097                                                  Jana M. Sadler
## 3098                                                                
## 3099                                                                
## 3100                                                                
## 3101                                                      Fidi Mwero
## 3102                                                                
## 3103                                                                
## 3104                                                                
## 3105                                                    Sheila Kamen
## 3106                                                                
## 3107                                                                
## 3108                                                                
## 3109                                           Yasmin Vishram-Morris
## 3110                                                                
## 3111                                                                
## 3112                                                                
## 3113                                                  Joseline Cubas
## 3114                                                                
## 3115                                                                
## 3116                                                                
## 3117                                                   Nina Anderson
## 3118                                                                
## 3119                                                                
## 3120                                                                
## 3121                                                     Erika Moore
## 3122                                                                
## 3123                                                                
## 3124                                                                
## 3125                                                  Tracey M Clark
## 3126                                                                
## 3127                                                                
## 3128                                                                
## 3129                                                   Nina Anderson
## 3130                                                                
## 3131                                                                
## 3132                                                                
## 3133                                                    Daniya Ahmed
## 3134                                                                
## 3135                                                                
## 3136                                                                
## 3137                                                Carmelle Ellison
## 3138                                                                
## 3139                                                                
## 3140                                                                
## 3141                                                     Teela Allen
## 3142                                                                
## 3143                                                                
## 3144                                                                
## 3145                                                   Mesha Muwanga
## 3146                                                                
## 3147                                                                
## 3148                                                                
## 3149                                                   Celen Emeruwa
## 3150                                                                
## 3151                                                                
## 3152                                                                
## 3153                                                 Keonna Robinson
## 3154                                                                
## 3155                                                                
## 3156                                                                
## 3157                        Reconnect Marriage and Family Counseling
## 3158                                                                
## 3159                                                                
## 3160                                                                
## 3161                                      Dr. Christina M. Charlotin
## 3162                                                                
## 3163                                                                
## 3164                                                                
## 3165                                           Gabriella Calò Siegel
## 3166                                                                
## 3167                                                                
## 3168                                                                
## 3169                                            Lilyan W.j. Campbell
## 3170                                                                
## 3171                                                                
## 3172                                                                
## 3173                                                     Diamond Lee
## 3174                                                                
## 3175                                                                
## 3176                                                                
## 3177                                                     Erica Fitts
## 3178                                                                
## 3179                                                                
## 3180                                                                
## 3181                                                     Saba Negash
## 3182                                                                
## 3183                                                                
## 3184                                                                
## 3185                                               Jesse De La Torre
## 3186                                                                
## 3187                                                                
## 3188                                                                
## 3189                                                   Kim Seabrooks
## 3190                                                                
## 3191                                                                
## 3192                                                                
## 3193                                       Shilethia Monique VanHook
## 3194                                                                
## 3195                                                                
## 3196                                                                
## 3197                                                    Scott Seomin
## 3198                                                                
## 3199                                                                
## 3200                                                                
##                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    X2
## 1                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Marriage & Family Therapist, MA, LMFT  
## 2                                                                                                                                                                                                                                                                                                                    Maybe you remember this scene from a movie; picture it, a peaceful airplane ride becomes turbulent. The plane begins losing altitude rapidly. The flight attendant urgently instructs you to "put your oxygen mask on first" before helping others. That simple, but critical statement, is just as important in our everyday lives.  Remembering to take time to yourself, non selfishly, can be difficult for anyone who tends to place others' needs first. Together,  we'll explore your thoughts, feelings, decisions, choices, wants, and needs in your therapy. I will assist you in" finding your voice" and help you to "put your oxygen mask on first.
## 3                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      (213) 513-5553
## 4                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    
## 5                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist, LMFT  
## 6                                                                                                                                                                                                                                                                                                                                                                           Accepting Teletherapy Clients Only. In today's world It can be so difficult to connect to our truth and live as our authentic selves. My mission is to create a non-judgmental, supportive and affirmative environment that will encourage you to heal, to grow and to reach your fullest potential. Through collaboration, empathetic listening and challenging negative patterns we will work together and help you reach your goals. Embarking on a therapeutic journey takes hard work, vulnerability and commitment. So if you are willing to put in the work I am committed to helping you succeed.
## 7                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <NA>
## 8                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    
## 9                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Clinical Social Work/Therapist, LCSW  
## 10                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Are you looking for someone to help you navigate through difficult times? Do you find yourself feeling alone with no one to help you find solutions to your problems? Are you a coupIe struggling to have a healthy relationship? I am a Licensed Clinical Social Worker in the State of California, Oregon and Washington providing hope and encouragement to those in need. I have over 9 years' experience as a psychotherapist and have worked with all ages, from early childhood to the aged adult.
## 11                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (323) 347-3314
## 12                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 13                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Clinical Social Work/Therapist, LCSW  
## 14                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           My primary goal in working in mental health is to put myself out of a job. Given that each of us intrinsically know what we need to heal and grow, my approach to psychotherapy is to couple your expertise of being you – your reality and lived experiences – with my skillset, in order to collaboratively work towards achieving your goals. Through a culturally-affirming and healing-centered stance, I utilize evidence-based treatments to facilitate our work.
## 15                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (213) 320-6802
## 16                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 17                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Marriage & Family Therapist Associate, AMFT  
## 18                                                                                                                                                                                                                                                                                                                                                                                Reaching out for help is one of the most humbling experiences we can go through in life. In a world that is constantly pushing narratives on us based on race, gender, sexuality and/or dominant cultural beliefs, it is life-affirming to engage preferred narratives that support and empower our own values. In difficult times it is easy to feel misunderstood or lost, longing to reconnect with our own resources. My work aims for those reconnections. My approach is collaborative, working from a place of respectful curiosity. I am not the expert on your lived experience. You are. 
## 19                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (213) 212-7852
## 20                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 21                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Pre-Licensed Professional  
## 22                                                                                                                                                                                                                                                                                                                                                                                                                                                                               I am in the final year of my master's degree in social work. As a masters-level clinician, I want to collaborate with you to address and achieve your therapeutic goals.   My experience includes working with survivors of domestic violence, sexual assault, and elder abuse, among other victimizations. I have facilitated domestic violence groups where I have educated survivors on the cycle of abuse, healthy relationships, and setting healthy boundaries with the people in their lives.
## 23                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <NA>
## 24                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 25                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Pre-Licensed Professional, MSW, ACSW  
## 26                                                                                                                                                                                                                                                                                                                                                  “We grow through what we have gone through”  Let’s be honest, life is tough, especially when trying to maintain a work/life balance and forget all the pain we have experienced in the past. \n        Black\n       men and women have their own unique set of challenges, but one commonality is the societal pressures, the weight of expectations, and the layers of individual and generational traumas that leave us confused, hurt, scared, and seeking answers. Despite these feelings you are experiencing, always remember, you still have the ability to control your own path even when things appear out of control.
## 27                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (424) 359-1355
## 28                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 29                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist, LMFT  
## 30                                                                                                                                                                                                                                                                                                                     Are you a \n        black\n       woman who’s found success in other parts of your life, but when it comes to your relationship...not so much? One day it’s all good, and the next day it’s all bad. You feel alone, isolated…like you can’t talk to anyone about what’s going on. You might feel embarrassed or what’s happening might just feel indescribable? You wish you could talk to your partner about it, but his mood is so unpredictable, you’re not sure if that’s even safe. I wonder if you find yourself confused most of the time? Like no matter what you do, it’s never right; you can almost never do the right thing when it comes to him.
## 31                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (424) 414-0292
## 32                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 33                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Psychologist, PhD  
## 34                                                                                                                                                                                                                                                                                                                   As a licensed psychologist for the past 37 years, I have worked with adult women and men - young, middle-aged and older - who have struggled with a range of anxiety, mood and relational issues.  My particular focus now is working with couples - married, separated or pre-marital - to strengthen relationship skills and sustain healthy marriages. I work well with clients who either have had minimal therapy exposure, or difficulties feeling understood due to challenges intersecting with cultural, contextual and communication dilemmas.  I have a limited practice, so I often work to assist others in finding culturally competent treatment.
## 35                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (323) 203-1891
## 36                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 37                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist, LMFT  
## 38                                                                                                                                                                                                                                                                                                                                                                                           As a \n        black\n       therapist in Los Angeles, I can relate to my clients who experience the beauty and challenges that come along with being a POC. Empathy and compassion are huge parts of the foundation of my approach. I specialize in working with the BIPOC community regarding career counseling, racial trauma, and challenges of identifying as mixed race/multiracial couple's counseling. I want to help you learn how to celebrate the beautiful cornerstones of your culture and rewrite the script of the traumas that have been passed down to your generation.
## 39                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (424) 396-5044
## 40                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 41                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Psychologist  
## 42                                                                                                                                                                                                                                                                                                            I am the therapist for “the strong friend.” I serve high-achieving, high-performing professional women who are the go-to problem solver and listening ear for just about everyone–often at the sacrifice of their own emotional health and wellness.  My heart is for women, especially \n        Black\n       women, to experience freedom and liberation from toxic narratives around value and worth. You get to be complex, emotional, angry, sad, and not okay.  You deserve to be cared for, attuned to, seen, validated, take up space, and live a life that brings you pleasure and joy. You get to prioritize you and not live a life of pure self-sacrifice.
## 43                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (424) 955-6724
## 44                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 45                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Clinical Social Work/Therapist, MSW, LCSW  
## 46                                                                                                                                                                                                                                                                                                                            We are a Licensed Clinical Social Work Practice servicing California and Massachusetts Residents, named for our founder and head therapist. We offer individual, couples, groups, classes, and coaching services to adults. Typically, our clients are experiencing difficulties in regulating emotions, worries, feeling on edge, or feeling good about themselves or relationships. Some specific concerns our clients are may be looking to address include PTSD, Veterans & Military, Anxiety & Panic, Depression, Self Esteem, Self Confidence and Self Image, Childhood Trauma, Attachment, Immigrant and Migrant Ideologies, and Sexual Assault.
## 47                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (818) 806-9851
## 48                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 49                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, PsyD, LMFT  
## 50                                                                                                                                                                                                                                                                                                                                                                                                                                                       Anxiety, depression, and various mental health concerns impact our ability to maintain happiness, meaningful relationships, and positive coping skills. Therapy can be intimidating and uncomfortable at times, but I pride myself in creating a very interactive, fun, and accepting experience while assisting my clients learn the tools needed to better support their overall well-being. I  invite you to collaborate with me, judgement free, to achieve your mental health needs both individually and relationally.
## 51                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <NA>
## 52                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 53                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Psychologist, PhD  
## 54                                                                                                                                                                                                                                                                                                                                                                                                                                                         Compassionate by nature and by nurture, Val is a licensed clinical psychologist with a heart for people, a mind for science, and a welcoming sense of humor. Her training and experience is based in cognitive behavioral therapy and behavioral medicine, with additional interests in positive psychology and \n        Black\n       women’s mental health. Val values a collaborative approach to therapy, and fosters an environment where clients feel seen and heard as they journey towards meeting their goals.  
## 55                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (213) 306-5582
## 56                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 57                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Pre-Licensed Professional, ASW  
## 58                                                                                                                                                                                                                                                                                                 As an inclusive and affirming clinician, I partner with clients to identify strengths and address barriers to achieving their goals and develop a path towards healing and overall wellness.  I work with individuals and couples of every gender expression and sexual orientation who are dealing with trauma, depression, anxiety, and stress. I am passionate about social justice and incorporate an anti-oppression and PIC abolitionist lens into my work, particularly in supporting \n        Black\n      , Indigenous, & people of color and LGBTQIA+ folks with issues of identity, racial trauma, difficult life transitions, parenting, and interpersonal struggles.
## 59                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (213) 296-0260
## 60                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 61                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Marriage & Family Therapist, MA, LMFT  
## 62                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             My name is Geoffrey Sherrell, M.A., LMFT. I am a Licensed Marriage & Family Therapist, providing online and in-person counseling services. Often, individuals are overwhelmed with emotions and feelings that cause their lives to be out of balance psychologically and spiritually. My goals for the individuals, families, and groups I serve are to restore balance and homeostasis within personal lives, family systems and social interactions.
## 63                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (855) 952-2279
## 64                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 65                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, AMFT, APCC  
## 66                                                                                                                                                                                                                                                                                                          Are you a multicultural couple wanting to set boundaries, discuss power and privilege, and improve communication; a \n        Black\n       woman professional overwhelmed by stress and trauma; a young adult desiring to develop your racial identity? I look forward to joining you on the path towards greater understanding and acceptance. My mental health and wellness approach centers on compassionate collaboration and direct truth-telling, and much of our work will challenge traditional ways of existing and relating. I value empathy, justice, and racial equity and believe in owning the impact of our words and actions rather than our intentions.
## 67                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (310) 868-2476
## 68                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 69                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Marriage & Family Therapist Associate, MA, AMFT  
## 70                                                                                                                                                                                                                                                                                                                        I am an inclusive, queer affirmative and culturally responsive Therapist with a a deep passion for working with individuals on the impacts of trauma, identity exploration, self-worth, sex related topics, and purpose; and all intimate relationship types such as monogamy and consensual non-monogamy (CNM) /polyamory. I am a certified Sex Therapist in progress of certifying in CNM Relationships from the Sexual Health Alliance; as well as trained in EMDR. I believe pleasure, joy and embodiment are acts of radical liberation in our systemic and overwhelming society and I hold a personal goal of empowering people to heal holistically.
## 71                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (310) 933-4091
## 72                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 73                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist, LMFT  
## 74                                                                                                                                                                                                                                                                                                                                                                                              I’m a \n        Black\n      , millennial therapist who’s passionate about helping clients develop a deeper connection to self while developing self-love and compassion despite the life challenges that they’ve faced. I know how difficult it may be to just be yourself. I create a safe, non-judgmental space that allows clients to heal, increase their self-awareness as well as their understanding of the influence that their past may have had on their present.  I see my clients as an equal partner; you’re in the driver seat while I'm riding "shotgun (passenger)."
## 75                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (424) 392-6960
## 76                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 77                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist, LMFT  
## 78                                                                                                                                                                                                                                                                                                                                                                                                                 I am a licensed Marriage and Family therapist with over 12 years of experience treating children, adolescents, young adults and families. My approach to therapy centers on my desire to help clients discover, learn, grow and heal. In order to facilitate meaningful change, I use various evidence-based treatments including Cognitive Behavioral Therapy, Acceptance and Commitment Therapy and Dialectical Behavior therapy. I believe that clients are resourceful and possess a unique set of strengths that will aid them in the therapeutic process.   
## 79                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (213) 306-5625
## 80                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 81                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Psychologist  
## 82                                                                                                                                                                                                                                                                                                            I am the therapist for “the strong friend.” I serve high-achieving, high-performing professional women who are the go-to problem solver and listening ear for just about everyone–often at the sacrifice of their own emotional health and wellness.  My heart is for women, especially \n        Black\n       women, to experience freedom and liberation from toxic narratives around value and worth. You get to be complex, emotional, angry, sad, and not okay.  You deserve to be cared for, attuned to, seen, validated, take up space, and live a life that brings you pleasure and joy. You get to prioritize you and not live a life of pure self-sacrifice.
## 83                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (424) 955-6724
## 84                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 85                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Clinical Social Work/Therapist, LCSW  
## 86                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Are you looking for someone to help you navigate through difficult times? Do you find yourself feeling alone with no one to help you find solutions to your problems? Are you a coupIe struggling to have a healthy relationship? I am a Licensed Clinical Social Worker in the State of California, Oregon and Washington providing hope and encouragement to those in need. I have over 9 years' experience as a psychotherapist and have worked with all ages, from early childhood to the aged adult.
## 87                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (323) 347-3314
## 88                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 89                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist, LMFT  
## 90                                                                                                                                                                                                                                                                                                                                                         I have been successful in supporting clients facing challenges such as, depression, anxiety, life transition, difficulties with work, family conflict, relationship concerns, stress, trauma, loss and grief, creativity, cultural issues, and racial trauma. I work with clients from all paths of life, including, artists/ creatives, adolescents, LGBTQIA+ individuals. I am committed to being a part of the collective effort to make mental health services more accessible for marginalized communities; therefore, I especially welcome clients who are \n        Black\n      , Indigenous, or who are of color.
## 91                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (213) 577-2385
## 92                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 93                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, AMFT, APCC  
## 94                                                                                                                                                                                                                                                                                                          Are you a multicultural couple wanting to set boundaries, discuss power and privilege, and improve communication; a \n        Black\n       woman professional overwhelmed by stress and trauma; a young adult desiring to develop your racial identity? I look forward to joining you on the path towards greater understanding and acceptance. My mental health and wellness approach centers on compassionate collaboration and direct truth-telling, and much of our work will challenge traditional ways of existing and relating. I value empathy, justice, and racial equity and believe in owning the impact of our words and actions rather than our intentions.
## 95                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (310) 868-2476
## 96                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   
## 97                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Pre-Licensed Professional, MSW, ACSW  
## 98                                                                                                                                                                                                                                                                                                                                                  “We grow through what we have gone through”  Let’s be honest, life is tough, especially when trying to maintain a work/life balance and forget all the pain we have experienced in the past. \n        Black\n       men and women have their own unique set of challenges, but one commonality is the societal pressures, the weight of expectations, and the layers of individual and generational traumas that leave us confused, hurt, scared, and seeking answers. Despite these feelings you are experiencing, always remember, you still have the ability to control your own path even when things appear out of control.
## 99                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     (424) 359-1355
## 100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, LCSW, PsyD  
## 102                                                                                                                                                                                                                                                                                                                                  As a Licensed Clinical Social Worker I have over 35 years in the field of Mental Health with the Los Angeles County. I have worked in the Juvenile hall systems as a Detention Offices primarily with adolescent boys age 10 thru 18 issues of gang, drugs and foster care. Later employed with King Drew Medical Center as a Clinical Social Worker in the 80's experiences with Cancer, AIDs, and emergency medication. Also worked at Augustus Hawkins providing Mental Health services for Crisis intervention. After retiring from Los Angeles I completed my PsyD and worked in the State Prison as a Unlicensed Psychologist for 3 years.
## 103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 538-2040
## 104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 106                                                                                                                                                                                                                                                                                                                                                                                                                           Do you find yourself stuck in unhealthy patterns that are causing you to show up as less than who you want to be? Are you frustrated with feeling like you have to keep it all together? Does your inability to say “no” keep you overwhelmed and out of balance? Perhaps, you are experiencing excessive worry about the future and question whether you’re on the right path or are doing enough. In cases like this, fear has taken a disruptive hold on your life and talking with friends and family, journaling and meditating just isn’t enough.
## 107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 736-2799
## 108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            My name is Geoffrey Sherrell, M.A., LMFT. I am a Licensed Marriage & Family Therapist, providing online and in-person counseling services. Often, individuals are overwhelmed with emotions and feelings that cause their lives to be out of balance psychologically and spiritually. My goals for the individuals, families, and groups I serve are to restore balance and homeostasis within personal lives, family systems and social interactions.
## 111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (855) 952-2279
## 112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Psychologist, PhD  
## 114                                                                                                                                                                                                                                                                                                        As a \n        Black\n       woman who is often seen as "having it all together," it may be challenging to admit that you are having a difficult time.  You may automatically say that you are "good" or "well" when people ask how you are doing but know deep down that this is a mask of how you are really feeling.  Recognizing and admitting to yourself about the mask is the first courageous step to getting support.  Even though many of us have been told to not let our guard down by showing others that we do not have it all together or that only "crazy" people who do not look like us go for therapy (not true!), you know what you need for yourself.
## 115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 328-5776
## 116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 118                                                                                                                                                                                                                                                                                                                                                                         Accepting Teletherapy Clients Only. In today's world It can be so difficult to connect to our truth and live as our authentic selves. My mission is to create a non-judgmental, supportive and affirmative environment that will encourage you to heal, to grow and to reach your fullest potential. Through collaboration, empathetic listening and challenging negative patterns we will work together and help you reach your goals. Embarking on a therapeutic journey takes hard work, vulnerability and commitment. So if you are willing to put in the work I am committed to helping you succeed.
## 119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <NA>
## 120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 122                                                                                                                                                                                                                                                                                            Are you looking for a space where you can keep it real and get support with achieving your goals?  Good, because I believe that everyone deserves the opportunity to create their best life. Building your happiness can be a challenging task as we are often faced with various societal stressors. As an \n        African American\n       woman, I am deeply aware of the societal stressors that hinder wellness.  Without the proper support, obstacles in life can prevent you from being healthy and happy. My desire is to support \n        Black\n       Women from varied and diverse backgrounds with creating and or sustaining the life that they want for themselves.
## 123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (510) 399-1757
## 124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PsyD  
## 126                                                                                                                                                                                                                                                                                                                     I enjoy working with people who want support as they engage in self-exploration and attempt to make sense of the complexity and intersections of their identities, including race and ethnicity, spirituality, sexual orientation, and socioeconomic status. I also believe that it is important for the people I work with to approach therapy as more than a culmination of sessions, but as part of a lifestyle and commitment to take time and space to prioritize one’s health. Additionally, I understand the power of self-study and that my role as a psychologist is to provide guidance and reminders as people connect with themselves and others.
## 127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <NA>
## 128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Marriage & Family Therapist, LMFT, LCSW, APCC, AMFT  
## 130                                                                                                                                                                                                                                                                                                       If you are an \n        African American\n      /\n        Black\n       or woman of color struggling with life stressors, mental health issues, imposter syndrome, self-esteem, trauma, racism in the workplace, generational trauma, or more, it is time to give Well-Play Counseling & Wellbeing Center a call. We have trained therapists waiting to assist you in your healing journey. We create a safe healing space free of judgment and shame so that you can heal. We are eclectic in our approach as one size does not fit all, we have therapists who specialize in CBT, inner child, Brainspotting, EMDR, and other modalities. Ready to heal, give us a call.
## 131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 498-2424
## 132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Psychologist, PhD  
## 134                                                                                                                                                                                                                                                                                                                                                    If you are experiencing feelings of sadness or depression, feeling overwhelmed with stress or anxiety, struggling with past trauma, feeling challenged by romantic relationships, having a hard time processing grief, if you are unsure of your purpose in life, confused about the next step in your career, or simply feeling like something is holding you back from reaching your full potential, I'd love to talk with you.  I'm Dr. Tai, the founder of The \n        Black\n       Girl Doctor, a completely virtual therapy practice specializing in the mental health of professional \n        Black\n       women.
## 135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <NA>
## 136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist Associate, MA, AMFT  
## 138                                                                                                                                                                                                                                                                                                                                  One of the most important things I can offer you as a therapist is a safe, honest, & collaborative experience. It all starts with our ability to be with each other authentically. If you feel seen & understood, then we can get to the sadness, anxiety, anger, loneliness, trauma and conflict. Every psychotherapist has a master's level education & goes through thousands of hours in supervised training. What makes the therapy process healing is the partnership - how we work together through the hard stuff. (Our fit.) Think of me as a guide that's with you to look at your unique lived experiences and to help you feel well.
## 139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 299-1974
## 140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Registered Psychological Assistant, PhD  
## 142                                                                                                                                                                                                                                                                                                                                   Deciding to engage in therapy is an important step in one’s life and I am honored by the opportunity to join in this journey with you. My work with clients begins from a place of genuine curiosity and authenticity. As a relational-cultural narrative therapist I believe that the person is not the problem. The problem is the problem and we work together to develop and implement effective tools aimed to address the problem. People are also defined by stories. When these stories become problematic, people can become stuck. Together we will examine these stories and help you develop new and healthy stories for your life.
## 143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (415) 687-2329
## 144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 146                                                                                                                                                                                                                                                                                                                                               I have been in practice as a psychotherapist for over 7 years.  My Master’s in Social Work focused on Critical Race Theory and Intersectionality and how our different life experiences shape and influence how we navigate our surroundings.  As a Licensed Clinical Social Worker, BIPOC (\n        Black\n      , Indigenous Person of Color) & LGBTQIA, and a veteran of the United States Armed Forces, some of my approaches in helping my clients identify their challenges and barriers to their identified problems start from a person-centered approach by discovering who they are and what they need and want in life.
## 147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (562) 207-5446
## 148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PsyD  
## 150                                                                                                                                                                                                                                                                                                                                    The decision to embark on the path of healing and face oneself, is not an endeavor to be taken lightly, as it requires courage, vulnerability, and patience with oneself. With that said, intentionally delving into a healing process can be a powerful and liberating experience - an amazing journey, filled with new discoveries about oneself. In my practice I help my clients shed light on their unconscious process, gain more awareness about themselves, including what motivates them, and better understand how they relate to others in their lives. I also support my clients in finding healthier ways of relating and coping.
## 151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (415) 340-6209
## 152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Counselor, MS, LGPC, CTP  
## 154                                                                                                                                                                                                                                                                                                                                              You deserve a therapist who will compassionately honor you for who you are now and walk with you as you evolve into the person you desire to be. As your therapist, I honor the unique emotional, mental, spiritual and psychic strengths you bring as an individual to the therapeutic process. This creates a safe space for you to gain a more compassionate awareness of who you are today, the pain you'll be able to overcome, and the confidence to manifest the hopes you have for the future. By approaching therapy in this holistic way, you are able to reflect, grow and evolve, authentically and with grace and ease.
## 155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <NA>
## 156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, PsyD, LMFT   
## 158                                                                                                                                                                                                                                                                                                                                  Are you tired of living each day on an emotional roller coaster, not knowing how you'll feel from one moment to the next?  Has life become so stressful that you wonder how you'll make it to the next day? Do you feel sad, tired and anxious more often than not? Just know that you are not alone. My commitment as a therapist is to assist individuals in experiencing better relationships not only with significant others, family and friends but with themselves in order to have a satisfying and fulfilling lived experience. I help individuals come to their best selves. Holding a place for self love, value and worth for self. 
## 159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 366-4042
## 160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PsyD  
## 162                                                                                                                                                                                                                                                                                                                                    The decision to embark on the path of healing and face oneself, is not an endeavor to be taken lightly, as it requires courage, vulnerability, and patience with oneself. With that said, intentionally delving into a healing process can be a powerful and liberating experience - an amazing journey, filled with new discoveries about oneself. In my practice I help my clients shed light on their unconscious process, gain more awareness about themselves, including what motivates them, and better understand how they relate to others in their lives. I also support my clients in finding healthier ways of relating and coping.
## 163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (415) 340-6209
## 164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              MA  
## 166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 TTWNT exist to create a safe and non-judgmental space for \n        Black\n       Christian Women to affirm the significance of their existence, to explore & discover their life's purpose, and to work in partnership to develop a plan for achieving their personal and/or professional goals.
## 167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (802) 444-8586
## 168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Clinical Social Work/Therapist, MSW, LCSW, LMSW-C  
## 170                                                                                                                                                                                                                                                                                                 I am grateful you have found your way to my profile. I recognize the significance in expressing a need for supportive care. This space is light and easy, meant to promote healing of the individual from a personal perspective. There is patience that is needed in gently nudging us toward our mental healthiness. Intersections in a space of healing are inevitable, and as a woman who identifies as \n        black\n      , military veteran and spouse, advocate in healing, and Licensed Clinical Social Worker, I am here to create pathways for those that feel healing is inaccessible or unattainable. To promote the overall evolution of the individual, safely.
## 171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (619) 292-0716
## 172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PsyD  
## 174                                                                                                                                                                                                                                                                                                                                                                      I’m excited to meet you! Therapy is a relationship. I believe in empowering my clients and helping them to take a collaborative role in their mental health care. Listening and getting to know you is crucial. I work with \n        Black\n       clients, LGBTQIA+ clients as well as clients from diverse backgrounds and use my training and understanding of human development to inform my therapeutic work and help my clients identify and understand their challenges so they can set meaningful goals. I work from an integrative perspective that incorporates diverse evidence based practices.
## 175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (562) 378-6987
## 176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Psychologist, PhD  
## 178                                                                                                                                                                                                                                                                                                                                   We work with a diverse clientele and specialize in providing social justice oriented psychotherapy to \n        Black\n       people and other People of Color as well as members of lesbian, gay, bisexual, transgender, and queer (LGBTQIA+) communities, neurodivergent clients, performers, educators, professionals, and caretakers. We provide culturally responsive and affirming therapy, which focuses on the strengths that you already have and work with you to build a safe space where you can share your experiences without the fear of being judged. Then we help you to focus on your aspirations, and how to make them real.
## 179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (415) 301-4390
## 180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 182                                                                                                                                                                                                                                                                                                                                          Kick start your journey to a more fulfilling and better quality of life with a FREE 15-Minute Consultation!  Lynda K. Cash has over 14 years of clinical experience as a marriage and family therapist. Lynda has experience working with \n        Black\n      /\n        African American\n       clients and is culturally competent in working with individuals, couples and families of all ethnicities to gain insight and understanding regarding unhealthy/dysfunctional behavioral life patterns. Lynda helps clients overcome challenges with managing their spiritual, mental, emotional, physical and financial well-being.
## 183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (818) 293-4798
## 184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Hey there, I'm Ashanique Nelson,  and I'm so glad your intuition led you here. I am a Los Angeles Licensed Clinical Social Worker in private practice. I have experience working with adults and youths to improve their self-awareness and coping skills. I am passionate about Maternal Mental Health and the wellbeing of the \n        Black\n       Community. I use a whole-person approach, emphasizing holistic practices and trauma-informed care.
## 187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 402-6278
## 188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 190                                                                                                                                                                                                                                                                                                                                                                                                                                                      You've tried talk therapy in the past but are still troubled by disturbing past events. You're ready for relief and to move forward with your life but feel held back by distressing memories or everyday anxieties. Whether you're a parent looking to be more present and calm with your children or a person of color experiencing a high level of stress, you're looking to break old patterns and a lineage of harm. You're ready to get on with your life and to feel the weight of past and on-going distress lifted.
## 191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (503) 822-3797
## 192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Counselor, MA, LMHC, LPCC, NCC  
## 194                                                                                                                                                                                                                                                                                                                                    Please Note: My practice is Virtual Only.  Our beliefs and how we see the world are influenced by things we don’t get to choose, like our families or the circumstances we’re born into. Even if we don’t get to choose these things, we have the ability to change in the ways we want to. Therapy can help us become more free. If you want to begin that journey in self discovery, I’m here to walk with you. We will explore the circumstances that shaped you. We will explore the past, present, and imagine the future. I will help serve as a navigator down the path to your answers, your destinations, and ultimately, your truth.
## 195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (201) 809-3771
## 196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist Associate, MA, AMFT  
## 198                                                                                                                                                                                                                                                                                                                                                Navigating daily life stressors, constant obstacles, breaking barriers, managing intense/ strong emotions, life transitions, dealing with grief/ loss, and complex traumas can be challenging. These challenges can cause you to feel anger, sadness, isolate from others, feel unmotivated, unclear about your path, cause conflicts with identity and create difficulties reaching your goals. No matter your circumstance, background or challenges you deserve to heal from, lived experiences, generational trauma, negative or debilitating thought processes and evolve and gain clarity into your true and authentic self.
## 199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 226-3733
## 200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 202                                                                                                                                                                                                                                                                                                                                               Telehealth Only - As a psychotherapist, it’s an honor to be a witness and facilitator to client transformation, resilience, and growth. My perceptiveness, compassion, and holding of a nonjudgmental space allow discovery and observation of patterns that may no longer be helpful. I see my work through a social justice perspective and understand oppression itself as a form of stress and trauma. As a mixed-race and multicultural person of \n        African-American\n       and Jewish ancestry,  I honor experiences of intersecting identities and am deeply interested in intergenerational trauma and resilience.
## 203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (510) 674-0948
## 204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Pre-Licensed Professional, ACSW, LMSW  
## 206                                                                                                                                                                                                                                                                                                                                                                  I am passionate about guiding clients on their journey to be their better self. I utilize a person-centered, trauma informed, and empowerment approach when working with clients.  I believe therapy is a tool that should be afforded to all individuals, and it is important for clients to have a therapist who looks like them and/or is understanding of their cultural experiences. As a \n        Black\n       clinician that identifies as a cisgender woman, I prioritize working with \n        Black\n       clients in general and \n        Black\n       women and LGBTQI+ persons in particular.
## 207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (562) 317-7531
## 208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Marriage & Family Therapist Associate, AMFT  
## 210                                                                                                                                                                                                                                                                                                                  I want to be your sparkle homie (a.k.a. therapist). What does it mean to be a sparkle homie? To me, a sparkle homie is a person that “gets you” where you are at. As a therapist (and sparkle homie), I seek to affirm, understand, and truly see folks. I utilize holistic, play, and nerd/geek-friendly therapies to be a partner in folks’ journey towards wholeness. Through the integration of geek, nerd, and gaming culture into the therapy process, I seek to understand clients on the basis of their personal passions. I want to know what a person’s game, anime, or comic of choice says about them and the hopes and strengths that they possess.
## 211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (805) 265-9065
## 212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MS, LMFT  
## 214                                                                                                                                                                                                                                                                                                                     You are ready to finally focus on you and get your peace & joy back, but you want to feel comfortable with the right therapist who looks like you & understands your culture, faith & background. You've been needing a safe and stable support to finally heal. I meet you right there in the pains of life with compassionate care and culturally-sensitive support to help you and your family heal from those traumas and wounds in a comforting relatable way. I provide insightful feedback to help you discover new solutions to old patterns so you can have functional wholeness emotionally, mentally, and relationally for a more fulfilling life.
## 215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (562) 553-8227
## 216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Pre-Licensed Professional, ACSW, MSW  
## 218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   I help BIPOC (\n        black\n      , indigenous, people of color) overcome anxiety, burnout, and racial trauma so they can live life liberated and with ease.
## 219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 431-9862
## 220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 222                                                                                                                                                                                                                                                                                             I have worked as a social worker for over a decade and, after years of supporting clients at various hospitals and nonprofits, am redirecting my talent and experience to where my passion truly resides: my own community. I directly relate to the first-hand struggles of \n        Black\n       women, and especially \n        Black\n       mothers, face every day. As a mother to 2 vibrant, empowered girls, I also understand how necessary it is to build ourselves up higher than the world could ever tear us down. Struggling with infertility for several years, I not only understand the needs of women on their journey to motherhood, I experienced it firsthand.
## 223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 561-1420
## 224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Counselor, MA, LPCC  
## 226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   My Private Practice dedicated to providing quality counseling services in the Los Angeles area.
## 227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 374-3338
## 228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, LMFT, MS  
## 230                                                                                                                                                                                                                                                                                                                    Therapy is an intimate collaboration in self-discovery, problem solving, and empowerment. By creating a consistent safe space, I aim to cultivate a meaningful therapeutic relationship with my clients where they feel comfortable and supported. This allows us to collaboratively create tailored solutions for symptom relief & personal growth. I appreciate serving folks who deal with anxiety, depression, grief, life transitions, and intergenerational trauma. I work with my clients to uncover how patterns of past unresolved conflict may be unconsciously repeated and disruptive to their current well-being and interpersonal relationships.
## 231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <NA>
## 232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist Associate, MA, AMFT, APCC  
## 234                                                                                                                                                                                                                                                                                                                                                                                                                                            BIPOC: \n        Black\n      , Indigenous, &/or People of Color. Includes white-passing & mixed-race BIPOC. Welcome Dear Reader, whether these are first steps or a familiar return, may our steps together support your movements. I am a Chinese-American Queer, by Ancestors’ way of Guangdong Province, China. My family settled on unceded Muwekma Ohlone territory (San Francisco) 3.5 generations ago, where I was born. Since then, I have supported folx's holistic health at opposite ends of the state, nation, and globe.
## 235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <NA>
## 236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Pre-Licensed Professional, MA/MFT  
## 238                                                                                                                                                                                                                                                                                                                                                   I have more than 30 years of experience in counseling, social services, and mental health services. My mission is to create a resilient, responsible individual by adding tools to achieve goals, build relationships, and communicate effectively. My practice has a focus on \n        Black\n       males of all ages, helping families overcome crisis, and working with individuals. I work with clients to help them build life skills to overcome challenges (Resilience) associated with environmental traumatic stress, grief and loss, transition stagnation, and behavioral challenges from historical mistreatment.
## 239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 421-0119
## 240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Marriage & Family Therapist Associate, MA  
## 242                                                                                                                                                                                                                                                                                                A native to Los Angeles I get it; the constant hustle, traffic, the grind of working to pay for life not psychotherapy. I know you’ve got valid reasons for why this isn’t the best time for therapy, but I’m calling your bluff. You’re not too busy, too old,  too \n        Black\n      , or too broken. This is “right time” because there will never be a right time to get well.  This is your moment.  I’m going to say you’ve slowed down just enough to feel; running errands with tears streaming down your face. Hating your spouse, your kids, but hating yourself more because you’re still hurting, still invisible, still in your trauma. My primary focus is kids
## 243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 387-3415
## 244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MS, LMFT  
## 246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               As a Licensed Family Therapist and Mental Health Advocate with a versatile work history in multiple clinical settings [USC Student Counseling Center, LLU Behavioral Health Institute, Adolescent/Adult/Geriatric Psych Units and Substance Abuse Treatment Centers], I am able to provide psychoeducation on a wide range of mental health topics, diagnoses, therapy modalities, and populations.
## 247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <NA>
## 248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 250                                                                                                                                                                                                                                                                                                                                                                                                It's hard to maintain balance in an intense world. Connecting with a safe, trained professional can help you uncover your strengths, resolve trauma, & increase peace. I'm eager to help my clients practice mindful coping, employ a solutions-focus, & attend to/soothe embodied sensations that arise as the wheel of the mind turns. I believe the richest healing unfolds in our therapeutic relationship - where we collaborate, build trust, work through what arises in the moment. As a person-centered psychotherapist, I meet you where you are as you are. Let's talk!
## 251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (805) 516-0742
## 252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Psychologist, PhD, EdM, MA  
## 254                                                                                                                                                                                                                                                                                                       Do you appear to have it all together but inside feel stressed, sad, or empty? Are you struggling to advance your goals or feel overwhelmed by the demands of the modern world? Do you yearn for love or close friendships but struggle with loneliness or painful relationships? If so, I’d love to talk with you. I am Dr. Akilah a licensed psychologist in California that specializes in helping busy professionals manage personal and professional success by focusing on mental wellness. As a professional woman myself, I know the importance of having a culturally congruent space for healing, which is why I joined the \n        Black\n       Girl Doctor. 
## 255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 320-6438
## 256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            I provide individual (not couples) therapy to curious people who are ready to get to work! Therapy is a place to gather tools to identify your feelings, better understand yourself, and manage uncomfortable emotions. I specialize in working with Fat/bigger-bodied people of all genders, \n        Black\n       and POC, & LGBTQIA+ individuals.
## 259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 615-1765
## 260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Psychologist, PhD  
## 262                                                                                                                                                                                                                                                                                                                          Dr. Teri D. Davis is a licensed clinical psychologist with over 15 years of offering evidence- based treatments for a wide-range of mental health concerns including anxiety, PTSD, depression, as well as sexual trauma and relationship issues. She specializes in treating these conditions in women, including women of color and military populations with formal training in women Veterans and military-related mental health care.  Let's heal together!                    *****Clinical Supervision for master's (starting January/2020 )and doctoral level students needing supervised hours for professional licensure.                     
## 263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 321-6237
## 264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Licensed Professional Counselor, LPC, LPCC  
## 266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Greetings, my name is April  Adams Edwards a Licensed Professional Counselor (LPC) in the state of Missouri. I have over 15 years of experience providing direct care to youth,  families, and communities. I established my private practice in 2012 and have been working with issues such as trauma, depression, anxiety relationships and family of origin conflicts. 
## 267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 781-0752
## 268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Marriage & Family Therapist  
## 270                                                                                                                                                                                                                                                                                                The weight of the world is tough to carry; especially when it's too heavy or nobody taught you how to shift the weight. \n        Black\n       and Brown men have been taught and held accountable to be strong and to never complain leaving them unable to feel comfortable feeling overwhelmed or understanding of their emotions. At The Weight Room, we will spot you by helping you learn how to carry and lift the weight of life in a healthy way or we help you learn how to put it down and leave it for good. We provide a safe, culturally aware and responsive environment for you to get the support you need. A space where your cultural identity is not an issue
## 271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (909) 345-8261
## 272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LICSW  
## 274                                                                                                                                                                                                                                                                                                                                                                                                          New you, new flow! Have you been able to process how your nervous system is adjusting to life's stressors? I take an empathetic and affirming approach and I acknowledge that doing the inner work can be difficult. I'm proud of you for considering & investing in yourself. I work with clients who are BI&POC-\n        Black\n       Indigenous and People of Color. I enjoy empowering clients as they explore how their nervous system is responding to past and current experiences. Your relationships, career and dreams are evolving and when you win, I win!
## 275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (202) 866-2115
## 276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 278                                                                                                                                                                                                                                                                                                                                                                                                                                                    Deciding to begin therapy is the first step in a life changing decision.  Welcome, my name is Marisol Cendejas , I am a bilingual therapist who cares about creating safer spaces to empower mental health and wellness in BIPOC (\n        Black\n      , Indigenous, and people of color), and all communities.  As a therapist who shares a similar background, I can understand your unique personal and professional experiences, family dynamics, and/or the stigmas against mental health in our community and culture.
## 279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (657) 222-2675
## 280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PsyD  
## 282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Soul-Centered Psychotherapy  —  My work supports your healing and finding your way back from grief, anxiety, and regret to your true, exciting, and unlimited self. Whatever the catalyst, know that in the seeking you are answering your soul’s cry for healing, expression, and expansion. Your journey towards healing and wholeness has already begun. 
## 283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (747) 285-7662
## 284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            LPC Intern, MA, APCC  
## 286                                                                                                                                                                                                                                                                                                                                                          I’m a big believer that therapy is for everyone. More than ever, with all the traumas of the last couple of years, folks of all races, cultures, and ages are in need of a healthy, safe, and judgment-free space to process and heal. I’ve spent the last decade providing counseling services and I have a passion for diversity, equity, and advocacy for those who face systemic barriers to mental health. My therapeutic relationships are grounded in unconditional support and positive regard. In a world full of adversity and disenfranchisement, it is invaluable to see ourselves as resilient and capable.
## 287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 651-6922
## 288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 290                                                                                                                                                                                                                                                                                                                         My client-centered approach to therapy places my clients at the forefront of their own healing journey as I guide and support each one of them. I believe that individuals are the experts of their lives and that my role is to provide a safe and nurturing space for growth.  My goal is to assist in identifying strengths and inherent characteristics to fuel resiliency in each client.  Clients are coached to understand that decisions made, relationships entered into, and responses to triggers are integral in the healing process by recognizing that trauma in its many forms impacts engagement in repetitive and/or negative behaviors.
## 291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 303-3672
## 292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, LCSW, MPA  
## 294                                                                                                                                                                                                                                                                                                                    NOW OFFERING TELETHERAPY M-TH 6:30 PM- 9 PM, MONDAY DAYTIME! We are living in a unique political climate. Going through life transitions, and having trouble adjusting? How about ongoing fatigue and stress caring for family? Experiencing increasing worry, anxiety or depression? We all struggle sometimes. It can feel debilitating trying to keep everything to yourself and master every problem. Utilize self care and give me a call. Therapy is a safe space to process deep emotional material. So many of us spend so much time caring for everyone else. But, forget to save a little energy for ourselves, to address our own needs. It's time.
## 295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 261-8785
## 296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Clinical Social Work/Therapist, EdD, MA, LMFT  
## 298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     I specialize in helping people to heal. I am committed to being of service and availing myself to those who need to heal emotional wounds, achieve more clarity, and agency over their lives.
## 299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (747) 203-0729
## 300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, LCSW, MSW  
## 302                                                                                                                                                                                                                                                                                                                              I am extremely passionate about empowering individuals, couples and families to heal and live their best, most authentic lives. I strongly believe that each and every individual, regardless of background, ability, or beliefs, should have a safe space where they can feel comfortable being their true self.  I know that sitting across from someone with similar experiences can help to build trust and promote connection, and am therefore deeply committed to holding space for women and people of color. I prefer that interested parties send an email to schedule a consultation or inquire about my services. No phone calls please.
## 303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 279-5438
## 304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 306                                                                                                                                                                                                                                                                                                                                                    Welcome! I have been providing counseling to children, teens, and parents from diverse backgrounds for over 7 years. My clinical training has been primarily working with children/teens who are experiencing difficulty maintaining their temper and demonstrate low impulse control. I also have about 10 years experience providing services for children with special needs (learning disabilities, ASD Spectrum). I specialize in providing parenting services to help parents/caregivers learn how to communicate with their children and implement positive behavioral strategies to meet their child’s specific needs.
## 307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 417-8923
## 308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Psychologist, PhD  
## 310                                                                                                                                                                                                                                                                                                                                                                                                                              Accepting new clients! Therapy Lab offers therapy that's based on a plan. Check out our website to see a menu of treatment plans based on common goals for therapy. With your input, we'll make a plan that's based on your goals, your timeline, and your budget. Our science-based plans are designed to support you in overcoming distress, so you walk away with emotional health and insight. At your first session, your exceptionally qualified therapist will get to know you and pick or design a plan that’s customized to your situation.
## 311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 886-0379
## 312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 314                                                                                                                                                                                                                                                                                                                                    Are you a busy student or working professional plagued with anxiety that gets in the way of you fully showing up?  I can help!  My client’s arrive mentally strained and guilt ridden for feeling the way they do.  Anxiety has no regard for who you are or how you grew up.  The anxiety experienced by those with a chaotic home life or history of trauma is no more valid than the anxiety experienced by those with seemingly stress free lives. There is no minimum threshold of suffering required for you to feel valid in seeking help for yourself or your loved one, only the desire to improve and the motivation to do the work.
## 315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (562) 548-7195
## 316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MS, LMFT  
## 318                                                                                                                                                                                                                                                                                                                                                                                                                                                                8/29/22 Accepting New Clients and Couples - You are not alone.  Any of us can be overwhelmed at times and seeking help demonstrates your courage and commitment to yourself.  After your consultation, we will gently help you address those specific areas you feel need to change.  Here, you will learn to look at these challenges with kindness which will allow your heart to access the ability to improve.   These first few steps of your journey are crucial to the ongoing healing you are looking for.
## 319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 629-4269
## 320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Marriage & Family Therapist Associate, AMFT  
## 322                                                                                                                                                                                                                                                                                                                                                                Upon starting a new therapeutic journey, I always share that through this process, we will change the idea of “why is this happening to me” to “everything is going according to plan.” As we get started, the first order of business is to construct an environment where you can feel seen, heard, and safe throughout this journey of self-discovery. The goal is to meet you where you are, so we can get you where you want to be. We will accomplish this by taking an integrative approach to facilitate personal growth and healing by identifying themes, unresolved conflicts, and behavioral patterns.
## 323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 361-0804
## 324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist Associate, AMFT, APCC  
## 326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Therapy is not a one size fits all; your story, pain, and journey is unique to you. As a therapist, I will take the time to listen to your story and develop an understanding of what you’re experiencing and help you explore changes to help you improve your life. I believe that therapy is a tool to help people in all stages of life heal and grow into the best version of themselves.
## 327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 986-3760
## 328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 330                                                                                                                                                                                                                                                                                                                      Day-to-day stressors, relationships, money problems, and even social media can provoke anxiety, negatively impact self-esteem and diminish a sense of well-being. In this day and age, most of us would benefit from having at least one non-judgmental person around who can provide solid guidance in helping us work through troublesome thoughts and feelings. "Be yourself," I always say. I'm here to provide a supportive environment that will foster growth and positive change. I provide culturally sensitive, individual therapy using evidence-based practices, including the application of a psychodynamic and cognitive-behavioral approach.
## 331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 861-2029
## 332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Marriage & Family Therapist, LMFT, EMDR, CSAT  
## 334                                                                                                                                                                                                                                                                                                                                                                    I'm dedicated and focused on providing you with high-quality counseling, tools and a solid plan to increase your mental health. My desire is to specifically help you with compulsive behaviors such as love addiction, as well as trauma, grief, sexual abuse, and anxiety. I believe that the goal of therapy is to understand your journey. While we cannot change the past, I provide a safe non-shaming therapeutic environment to enable you to deeply connect with the therapeutic process to facilitate your growth, and move towards healing. Professional verification provided by Psychology Today 
## 335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 455-8531
## 336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist, MA  
## 338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Have you been putting up with half-assed relationships because it seems better than nothing? Have you been giving your all to everyone and everything around you and wondering when are you going to get something back? Do you look at yourself in the mirror sometimes and say I don't like myself anymore? Have you been noticing that the things that are most important to you get the least amount of time energy and nurturing?
## 339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 342-2277
## 340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 342                                                                                                                                                                                                                                                                                                                          My goals as a therapist are to help my clients recognize their capacity for self-sufficiency and self-advocacy, ultimately recognizing the power that they wield. This work is done through the development of a relationship based on acceptance, respect, and collaboration. My job is to help you navigate through the complexities of life so that we can understand the underlying factors that contribute to your current struggles. This understanding may pave the way for us to work towards decreasing the distress you may be experiencing and begin working towards healing the relationships that we have with ourselves and our community.
## 343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 354-8592
## 344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Counselor, LPCC, LCMHC  
## 346                                                                                                                                                                                                                                                                                                                               I have extensive experience working with teenage and young adult populations; I have worked in a variety of therapeutic settings and am very familiar with the needs facing teenage and young adult populations. Given my experience, I have developed a therapeutic approach that aligns with the needs of these populations; I pride myself on a non-traditional approach to therapy, and focus primarily on meeting my clients where they are. I value providing a safe, comfortable space for teens and young adults to be themselves. I have always found that mental health is as important as physical health and should be treated as such.
## 347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 312-0291
## 348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        MSW, ASW  
## 350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Are you looking for a therapist who will encourage you with compassion and without judgment? I have unfortunately seen those marginalized by society really suffer and lose sight of who they truly are. I want to really get to know you. I will see you as the individual you are and will provide the safe space you have been searching for. My passion is to help and see you succeed and reach your greatest potential.
## 351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 846-8657
## 352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 354                                                                                                                                                                                                                                                                                                                           Life is a lot to handle at times. This as well as depression, anxiety, transitions, loss, pain caused by trauma, societal norms that misalign with our personal values, career uncertainty, self-doubt, relationship issues, & more. Weeks, months, and even years can go by before we even realize how much it is impacting us in all areas. The beauty in these situations is an opportunity to develop the healthiest version of ourselves with support. Many people turn to therapy. It’s no secret that people do not come to therapy just to talk, but, to also turn their challenges into opportunities for insight, growth, & goals to achieve.
## 355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 816-5065
## 356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Are you a couple, individual or family in need of new coping skills? Due to the pandemic you may be experiencing more uncertainty, fear, and sadness. Perhaps you're overwhelmed with family dynamics and re-entry.  So much of our collective experience has changed in a short period and you may need help processing it all. If you are feeling a bit lost, or experiencing symptoms of depression and anxiety,  you may benefit from therapy now.
## 359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 375-2872
## 360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 362                                                                                                                                                                                                                                                                                                                                                    Welcome! I have been providing counseling to children, teens, and parents from diverse backgrounds for over 7 years. My clinical training has been primarily working with children/teens who are experiencing difficulty maintaining their temper and demonstrate low impulse control. I also have about 10 years experience providing services for children with special needs (learning disabilities, ASD Spectrum). I specialize in providing parenting services to help parents/caregivers learn how to communicate with their children and implement positive behavioral strategies to meet their child’s specific needs.
## 363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 417-8923
## 364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist Associate, MS, AMFT  
## 366                                                                                                                                                                                                                                                                                                                                              Megan is passionate about advocating for all minority populations and seeks to hold space for and journey with individuals to empowerment and healing. She believes that everyone is capable and deserving of healing and through great insight, removed stigma/shame, and unconditional positive regard one can implement newfound tools to show up more authentically in the world and heal through vulnerability. Previously she worked with a community clinic serving Los Angeles, where she gained experience working with a wide range of ages and populations from kids, teens, young adults, adults, couples, and families.
## 367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 205-0752
## 368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PsyD  
## 370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Soul-Centered Psychotherapy  —  My work supports your healing and finding your way back from grief, anxiety, and regret to your true, exciting, and unlimited self. Whatever the catalyst, know that in the seeking you are answering your soul’s cry for healing, expression, and expansion. Your journey towards healing and wholeness has already begun. 
## 371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (747) 285-7662
## 372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, MSW, LCSW  
## 374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           You used to live a normal life… then the thoughts took over.  The thoughts got in the way of time with your friends and family.  They threatened your goals.  They filled your mind and crowded out your self-esteem.  You've been trying to get better from regular therapy, but it’s not working.  You are tired of wondering “what if” about every little thing. You just want all this to stop so you can feel like yourself again.
## 375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 572-6647
## 376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist, MA  
## 378                                                                                                                                                                                                                                                                                                                                                                               As a creative woman, you struggle with feeling confident. You know you want to make a change but you’re not sure how. Maybe you’re struggling with deeply rooted issues that make it hard to move forward in life, or how other people perceive you.  Perhaps low self-worth makes it difficult to express yourself creatively. You worry that the way you feel about yourself keeps you from living the life you really want. And you don’t feel like the kind of woman you want to be.  As a creative, you feel like you're failing and the confidence you have in your relationships is eroding.
## 379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 433-6286
## 380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Psychologist, PhD  
## 382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 My primary tasks are to help clients become aware of their innate ability to heal themselves and to help them create solutions to problems that may have seemed unsolvable.  From a theoretical perspective, my approach is grounded in psychodynamic theory, attachment theory, and the cognitive and behavioral therapies; but above all, my work is pragmatic.
## 383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 645-1768
## 384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Are you seeking emotional and physical healing? Are you seeking to improve your self-esteem or relationships? Are you dealing with a life transition or a family conflict? Do you have an adolescent who is struggling with making smart decisions, feeling depressed, or having difficulties interacting with peers? Together we can work through these concerns and more.
## 387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 516-8692
## 388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MS, LMFT  
## 390                                                                                                                                                                                                                                                                                                                                                                 Are you feeling anxious & dissatisfied about your current way of being? Are you noticing habits & patterns that no longer serve you or have you feeling stuck? We all have patterns, learned throughout life, that attempt to keep us from our fullest potential. These patterns can cause us to become anxious, depressed, or question our entire purpose in life should they not align with our desired narrative. Maybe we question the validity of our feelings or the way we navigate conflict. One of the biggest side effects of our learned behaviors is feeling inauthentic to who we truly wish to be. 
## 391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (818) 791-4283
## 392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Counselor, PhD, NCC, LPCC, LMHC, LPC  
## 394                                                                                                                                                                                                                                                                                                                   With years of experience working with clients going through individual, relationship, and family issues, Celebrity Therapist Jeff Rocker has provided therapeutic services to clients from as young as 3 years old to individuals in their late adulthood. Over the years, Dr. Jeff has organized lectures and various events in the community, including excursions and retreats for couples to improve their communication and gain a better understanding of each other. He has experience working with athletes such as those in the NFL, NBA, and MLB. In addition, Dr. Jeff has also worked with clients in the Movie, Music, and Entertainment Industry.
## 395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (562) 685-9636
## 396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist Associate, MA, AMFT  
## 398                                                                                                                                                                                                                                                                                                                    Life can be overwhelming at times because so much is happening to us and around us everyday. Navigating your way through all of it, in the healthiest way possible,  can sometimes seem harder than the challenges themselves. Maintaining your peace, living unapologetically, setting boundaries, processing your emotions, owning your truths and overcoming one obstacle after another can all sound like easy tasks, but we’ve all struggled with them. I’m here to invite you into a safe and brave space of recognizing and resolving the challenges you face, while we discover your strengths. The time for radical change and healing is always now.
## 399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 205-0964
## 400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist Associate, MA, AMFT  
## 402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   I work with people from all walks of life, including LGBTQIA+ and individuals from the global majority who experience marginalization. My approach is sex and body positive, and always (and in all ways) respectful of the intersectionality of identities. I have a particular interest in working with artists and survivors of sexual trauma, single or partnered, who want to (re)connect with their sense of desire, sexual agency, and sensual vitality.
## 403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 383-7467
## 404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        I work with couples and individuals. If you are struggling with stress, anxiety, depression, low self-esteem, postpartum, parenting skills, relationship challenges, family issues, domestic violence, loss/grief, identity, race and cultural issues, or just need someone to talk to, I am here for you.
## 407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (818) 862-7040
## 408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 410                                                                                                                                                                                                                                                                                                                          My goals as a therapist are to help my clients recognize their capacity for self-sufficiency and self-advocacy, ultimately recognizing the power that they wield. This work is done through the development of a relationship based on acceptance, respect, and collaboration. My job is to help you navigate through the complexities of life so that we can understand the underlying factors that contribute to your current struggles. This understanding may pave the way for us to work towards decreasing the distress you may be experiencing and begin working towards healing the relationships that we have with ourselves and our community.
## 411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 354-8592
## 412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist Associate, MA, AMFT  
## 414                                                                                                                                                                                                                                                                                                                    Life can be overwhelming at times because so much is happening to us and around us everyday. Navigating your way through all of it, in the healthiest way possible,  can sometimes seem harder than the challenges themselves. Maintaining your peace, living unapologetically, setting boundaries, processing your emotions, owning your truths and overcoming one obstacle after another can all sound like easy tasks, but we’ve all struggled with them. I’m here to invite you into a safe and brave space of recognizing and resolving the challenges you face, while we discover your strengths. The time for radical change and healing is always now.
## 415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 205-0964
## 416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Associate Clinical Social Worker, ASW  
## 418                                                                                                                                                                                                                                                                                                                                                                                                                                                                    I believe we all have the power within us to create meaningful life changes. My clients aim to tap into their greatest strengths and potential by taking time to process thoughts, emotions, and lived experiences. As a therapist, I work to create and hold a supportive space for individuals, couples, and families to be seen, felt, and heard. Together my clients and I engage in somatic body-based experiences, build our perspectives and awareness, and explore ways to achieve greater well-being.
## 419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 775-2685
## 420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        PhD, MFT  
## 422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Personal growth, emotional and mental wellness is possible! We can help whether it’s related to work, anxious thoughts, trauma, family or  relationships. Our approach is tailored to treat the whole person. And to help you thrive!
## 423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 933-9484
## 424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 426                                                                                                                                                                                                                                                                                                                                                                                                                                                         I strive to cultivate a trusting and honest relationship with my clients so that they feel fully seen. I have more than 10 years of experience working with families, individuals, children, and adolescents in various settings including schools, direct therapy, community mental health, non-profits, child welfare, and criminal justice. I provide clinical services to individuals experiencing anxiety, depression, trauma, relationship issues, high-stress work environments, and coping with life transitions.
## 427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 379-3589
## 428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist Associate, AMFT, APCC  
## 430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Therapy is not a one size fits all; your story, pain, and journey is unique to you. As a therapist, I will take the time to listen to your story and develop an understanding of what you’re experiencing and help you explore changes to help you improve your life. I believe that therapy is a tool to help people in all stages of life heal and grow into the best version of themselves.
## 431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 986-3760
## 432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Psychological Associate, PsyD  
## 434                                                                                                                                                                                                                                                                                                                                                   Balance is essential to a happy life, and therapy can help you achieve it. Young adults (age 18-39) have so much adjustment in their lives, but need help reaching their potential. These are the best times full of hope and freedom, but are often weighed down by anxiety and feelings of sadness. If you are experiencing difficulties in being a student, an early or transitioning career professional, a new spouse, or working through balancing health, now is the time to move forward. Learn how to develop emotional safety, create balance, recapture your purpose and focus, and improve your performance skills.
## 435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               (310) 496-3450 x109
## 436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Psychologist, PhD  
## 438                                                                                                                                                                                                                                                                                                                                                                                                                              Accepting new clients! Therapy Lab offers therapy that's based on a plan. Check out our website to see a menu of treatment plans based on common goals for therapy. With your input, we'll make a plan that's based on your goals, your timeline, and your budget. Our science-based plans are designed to support you in overcoming distress, so you walk away with emotional health and insight. At your first session, your exceptionally qualified therapist will get to know you and pick or design a plan that’s customized to your situation.
## 439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 886-0379
## 440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            LPC Intern, MA, APCC  
## 442                                                                                                                                                                                                                                                                                                                                                          I’m a big believer that therapy is for everyone. More than ever, with all the traumas of the last couple of years, folks of all races, cultures, and ages are in need of a healthy, safe, and judgment-free space to process and heal. I’ve spent the last decade providing counseling services and I have a passion for diversity, equity, and advocacy for those who face systemic barriers to mental health. My therapeutic relationships are grounded in unconditional support and positive regard. In a world full of adversity and disenfranchisement, it is invaluable to see ourselves as resilient and capable.
## 443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 651-6922
## 444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Clinical Social Work/Therapist, LCSW, LMFT, ACSW, AMFT, APCC  
## 446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        AMR Therapy focuses on assisting clients through a social justice and self-empowerment lens. We are a small diverse group of therapists with unique life experiences that informs work with clients.  We know people need a safe space and resources to do therapy, and this is what we strive to provide.
## 447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (650) 643-3825
## 448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Trouble getting out of bed? Ready to start enjoying life? Is this affecting your relationships and overall happiness? Can't stay focused, always off task.  Anxious feeling you can't shake? Anger is out of control; find yourself yelling at the world. Tired of being single? Love is not hard to find, it starts with loving yourself. Therapy can help break the cycle of stress and aid in developing the necessary tools to combat life stressors.
## 451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 784-7630
## 452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist, MA  
## 454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Have you been putting up with half-assed relationships because it seems better than nothing? Have you been giving your all to everyone and everything around you and wondering when are you going to get something back? Do you look at yourself in the mirror sometimes and say I don't like myself anymore? Have you been noticing that the things that are most important to you get the least amount of time energy and nurturing?
## 455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 342-2277
## 456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, LCSW, MPA  
## 458                                                                                                                                                                                                                                                                                                                    NOW OFFERING TELETHERAPY M-TH 6:30 PM- 9 PM, MONDAY DAYTIME! We are living in a unique political climate. Going through life transitions, and having trouble adjusting? How about ongoing fatigue and stress caring for family? Experiencing increasing worry, anxiety or depression? We all struggle sometimes. It can feel debilitating trying to keep everything to yourself and master every problem. Utilize self care and give me a call. Therapy is a safe space to process deep emotional material. So many of us spend so much time caring for everyone else. But, forget to save a little energy for ourselves, to address our own needs. It's time.
## 459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 261-8785
## 460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Clinical Social Work/Therapist, LICSW, LCSW-C, LCSW  
## 462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Have you been living the same script with different cast members? Do you want to overcome life's most complicating situations? Are you on a quest to get to know yourself better? Do you want to make your wildest dreams a reality? Life's most precious gifts are often on the other side of our comfort zone. How do I know? Because therapy changed MY life! 
## 463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 233-1540
## 464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 466                                                                                                                                                                                                                                                                                                                                                        Are you interested in living life to the fullest but struggle to achieve it?  You've taken the first steps towards healing. Carter Care Therapeutic Services is dedicated to you! Regardless of what you're going through, our team of Licensed Therapist will strive to bring out the best in you. You're not alone. We can assist you in resolving your past pain! We will affirm your strengths and challenge you to use them. While promoting insight, healing and change in an environment full of warmth and genuineness. Carter Care Therapist are here to provide a safe, unbiased and non-judgmental environment.
## 467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 352-8853
## 468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 470                                                                                                                                                                                                                                                                                                                                             Welcome to our group practice. If you are struggling with Depression, Anxiety or Relationship stress, then you have come to the right place.  We offer a safe space to support and treat the problems you are facing.  Whether you are suffering from a recent breakup, feeling anxious or depressed about relationships (family, co-workers, or friends), or just having a hard time coping with life's challenges, we are here to help you get through this.  Our group specializes in creating healthy relationships, working through anxiety, depression, getting "unstuck," working through addictions, and healing from trauma.
## 471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (818) 495-8986
## 472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              The clients who seek me most are those searching for meaning in the adverse events that have happened to them and their courage to live wholly and fully while suffering. I believe people who are ready for this style of rich internal therapy work are willing to leave the comfort of their suffering to live a more authentic life with grace and flexibility through radical self-acceptance. 
## 475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <NA>
## 476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Clinical Social Work/Therapist, EdD, MA, LMFT  
## 478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     I specialize in helping people to heal. I am committed to being of service and availing myself to those who need to heal emotional wounds, achieve more clarity, and agency over their lives.
## 479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (747) 203-0729
## 480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 482                                                                                                                                                                                                                                                                                                                   “No one saves us but ourselves. No one can and no one may. We ourselves must walk the path”- Buddhist quote . I am here to support you on this path. Feeling heard, respected, and validated when life feels overwhelming can be a great comfort. Are you are dealing with a past trauma that feels unbearable, hindering you from your authentic self? Maybe it's been difficult to create boundaries, leaving you feeling depleted and unable to incorporate self-care. Perhaps you and your partner are struggling to empathize with one another. My goal is to aid my clients to release from harmful patterns and process past pain that impair wellbeing.
## 483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 233-1547
## 484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              When you are ready to work through relationship issues at a much deeper level and achieve maximum healing, to take a penetrating look at unresolved childhood trauma, to get on with your life in the most authentic manner possible, I can assist, guide, and witness your journey.
## 487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 740-9886
## 488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Associate Clinical Social Worker, ACSW  
## 490                                                                                                                                                                                                                                                                                                                                You struggling with negative self-talk, you are your harshest critic, and you’re ready to make a change because you see how that gets in your way. Whether you have anxiety, depression, or are struggling in your relationships, you know that you want to be living differently and you’re just not sure how to make a change for yourself. You're discouraged from continuing towards your dreams a and want a trauma-informed and culturally sensitive therapist who really sees you and hears you. You want nothing more than to feel confident in yourself and live a life that is aligned with your values. You've come to the right place.
## 491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 827-8450
## 492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Marriage & Family Therapist, LMFT, EMDR, CSAT  
## 494                                                                                                                                                                                                                                                                                                                                                                    I'm dedicated and focused on providing you with high-quality counseling, tools and a solid plan to increase your mental health. My desire is to specifically help you with compulsive behaviors such as love addiction, as well as trauma, grief, sexual abuse, and anxiety. I believe that the goal of therapy is to understand your journey. While we cannot change the past, I provide a safe non-shaming therapeutic environment to enable you to deeply connect with the therapeutic process to facilitate your growth, and move towards healing. Professional verification provided by Psychology Today 
## 495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 455-8531
## 496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  My client’s come to me because they want the truth. I provide a non judgmental, supportive, and transparent environment, so together, we can reflect on the core causes of your anxiety, traumas, depression, fears, relationship challenges, maladaptive coping mechanisms. Holding a safe space allows you to do the real inner work. It is my experience that when we treat the root cause of an issue, the symptoms go away.
## 499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 233-1970
## 500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Psychologist, PhD  
## 502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Anxiety, depression, trauma, relationship issues, major life stressors. Our clients are smart, capable people struggling despite their best efforts. They have held themselves together just well enough for years, but then they reach a tipping point and know they need the help of an expert. Through individual therapy, couples therapy or group therapy, we help them better understand themselves and how to get what they need out of life.
## 503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 716-1253
## 504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 506                                                                                                                                                                                                                                                                                                                                                                                                                                                         I strive to cultivate a trusting and honest relationship with my clients so that they feel fully seen. I have more than 10 years of experience working with families, individuals, children, and adolescents in various settings including schools, direct therapy, community mental health, non-profits, child welfare, and criminal justice. I provide clinical services to individuals experiencing anxiety, depression, trauma, relationship issues, high-stress work environments, and coping with life transitions.
## 507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 379-3589
## 508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 510                                                                                                                                                                                                                                                                                                                                    Are you a busy student or working professional plagued with anxiety that gets in the way of you fully showing up?  I can help!  My client’s arrive mentally strained and guilt ridden for feeling the way they do.  Anxiety has no regard for who you are or how you grew up.  The anxiety experienced by those with a chaotic home life or history of trauma is no more valid than the anxiety experienced by those with seemingly stress free lives. There is no minimum threshold of suffering required for you to feel valid in seeking help for yourself or your loved one, only the desire to improve and the motivation to do the work.
## 511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (562) 548-7195
## 512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MS, LMFT  
## 514                                                                                                                                                                                                                                                                                                                                                                                                                                                                8/29/22 Accepting New Clients and Couples - You are not alone.  Any of us can be overwhelmed at times and seeking help demonstrates your courage and commitment to yourself.  After your consultation, we will gently help you address those specific areas you feel need to change.  Here, you will learn to look at these challenges with kindness which will allow your heart to access the ability to improve.   These first few steps of your journey are crucial to the ongoing healing you are looking for.
## 515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 629-4269
## 516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 518                                                                                                                                                                                                                                                                                                                                                                                                                                                  Are you stuck in a rut, going through a difficult life transition, or just not feeling like yourself? Life is not a linear process and comes with ups and downs that can cause us to experience difficult emotions. Sometimes we need guidance in finding our center again, getting back to who we authentically are, and finding what brings us fulfillment.  Kristin Howard is a licensed Marriage and Family Therapist in the Los Angeles area, and is here to support you on your journey toward healing and self-discovery.
## 519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 773-5422
## 520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Licensed Professional Clinical Counselor, LPCC, LCPC, CPC  
## 522                                                                                                                                                                                                                                                                                                                                                                                                         I'm a Licensed Professional Clinical Counselor with 15 years of experience. My work consists of individual psychotherapy with adult clientele only. I enjoy helping people and compassionate in my work with clients. Everyone experiences challenges in life; however, it's through the challenges that you grow the most. Together, we will work closely to analyze what struggles you are facing and their underlying causes, and work towards implementing change to the behaviors and thought patterns that are keeping you from being the best version of yourself.
## 523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (562) 306-1014
## 524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, PsyD, LCSW  
## 526                                                                                                                                                                                                                                                                                                                                      I am a licensed clinical social worker in both CA and IL with over nine years of experience as a therapist and life coach. I also have my doctorate in clinical psychology. My counseling style is warm and interactive and rooted in cognitive behavioral therapy and solution-focused therapy. I employ a humanistic, holistic, person-centered, strengths-based, culturally competent approach. I believe in treating everyone with respect, sensitivity, and compassion, and prioritize fostering a healthy therapeutic relationship. I ensure the client is heard, validated, and contributes to their treatment plan and goal setting.
## 527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (818) 962-2824
## 528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 530                                                                                                                                                                                                                                                                                                                          My goals as a therapist are to help my clients recognize their capacity for self-sufficiency and self-advocacy, ultimately recognizing the power that they wield. This work is done through the development of a relationship based on acceptance, respect, and collaboration. My job is to help you navigate through the complexities of life so that we can understand the underlying factors that contribute to your current struggles. This understanding may pave the way for us to work towards decreasing the distress you may be experiencing and begin working towards healing the relationships that we have with ourselves and our community.
## 531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 354-8592
## 532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 534                                                                                                                                                                                                                                                                                                                                              In a society with high standards, caregiving challenges, and demanding work environments, it is easy to forget about our own well-being. It can even appear more convenient to put our mental health on the back-burner, but if we disregard self-care it can lead to a burnout. Burnout can lead to mental exhaustion, cynicism, detachment, and depression. Furthermore, when we are burnt out, the light we shine on and for others is diminished. I can assist and support you in working through hardships that may cause you frustration, have you in a burnout state, and/or make it difficult for you to manage daily tasks.
## 535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 561-6266
## 536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        I work with couples and individuals. If you are struggling with stress, anxiety, depression, low self-esteem, postpartum, parenting skills, relationship challenges, family issues, domestic violence, loss/grief, identity, race and cultural issues, or just need someone to talk to, I am here for you.
## 539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (818) 862-7040
## 540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 542                                                                                                                                                                                                                                                                                                                                                                                  Everyone has a story to be told. I believe the relationship that we cultivate with our individual stories has an impact on our quality of life. I specialize in supporting individuals working through life experiences, such as, trauma, adjustments, relational issues, grief and loss, low self-esteem anxiety and depression. My intention is to provide a safe and compassionate space for individuals to share their journey by taking an introspective look within. Through this lens we learn to acknowledge our life experience, tend to our needs and rediscover authentic expression.
## 543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 559-1566
## 544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Associate Clinical Social Worker, ACSW  
## 546                                                                                                                                                                                                                                                                                                                                                               I am so honored and excited to have you in this space with me. Maybe you are looking for a therapist who can understand and relate to your experiences as a QTIPOC/LGBTQUIA2S+ person or maybe you are just simply looking for a nonjudgmental presence to walk along this journey called life with you, if so, then you are definitely in the right place. I am an Afro-Latina, Neurodivergent, LGBTQUIA2S+ identified and affirming therapist who inhabits multiple intersections and am always doing the work to not only be intersectional, welcoming, and affirming for all those that enter the therapy room.
## 547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (818) 740-5062
## 548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 550                                                                                                                                                                                                                                                                                                                                                    Welcome! I have been providing counseling to children, teens, and parents from diverse backgrounds for over 7 years. My clinical training has been primarily working with children/teens who are experiencing difficulty maintaining their temper and demonstrate low impulse control. I also have about 10 years experience providing services for children with special needs (learning disabilities, ASD Spectrum). I specialize in providing parenting services to help parents/caregivers learn how to communicate with their children and implement positive behavioral strategies to meet their child’s specific needs.
## 551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 417-8923
## 552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist Associate, AMFT, APCC  
## 554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Therapy is not a one size fits all; your story, pain, and journey is unique to you. As a therapist, I will take the time to listen to your story and develop an understanding of what you’re experiencing and help you explore changes to help you improve your life. I believe that therapy is a tool to help people in all stages of life heal and grow into the best version of themselves.
## 555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 986-3760
## 556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, MSW, LCSW  
## 558                                                                                                                                                                                                                                                                                                                         Therapy is a powerful decision to begin the work towards realizing a more whole and fulfilling life. What past events have shaped you and how you experience the world? What patterns or blockages keep you stuck in survival mode and unable to fully thrive? What limiting beliefs continue to impact your relationship with yourself and others? I am a licensed clinical therapist practicing in Los Angeles within a relational, holistic, and person-centered framework. I have 11 years of experience working with those who live with depression, anxiety, trauma, grief, or need support in navigating everyday challenges and life transitions.
## 559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 277-4253
## 560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 562                                                                                                                                                                                                                                                                                                                                                                                                        "We delight in the beauty of the butterfly, but rarely admit the changes it has gone through to achieve that beauty." (Maya Angelou)     I understand that as we experience life we will inevitably encounter obstacles and stressors that challenge us to change. I also believe these moments present opportunities for transformation. I recognize that life transitions and personal experiences can sometimes be overwhelming, however they can also be valuable seasons with the potential to generate "peak and valley" experiences that can alter our life course.
## 563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 421-4476
## 564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, MSW, LCSW  
## 566                                                                                                                                                                                                                                                                                                                         Therapy is a powerful decision to begin the work towards realizing a more whole and fulfilling life. What past events have shaped you and how you experience the world? What patterns or blockages keep you stuck in survival mode and unable to fully thrive? What limiting beliefs continue to impact your relationship with yourself and others? I am a licensed clinical therapist practicing in Los Angeles within a relational, holistic, and person-centered framework. I have 11 years of experience working with those who live with depression, anxiety, trauma, grief, or need support in navigating everyday challenges and life transitions.
## 567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 277-4253
## 568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Licensed Professional Clinical Counselor, LPCC  
## 570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            I value the importance of having a therapeutic relationship. I support them by providing education, coping strategies, and grounding techniques while guiding my clients toward healing and awakening. I have extensive knowledge of the principles and techniques of mental health counseling and I am someone who can talk to people about their problems and feelings in a confidential and dependable environment.
## 571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 610-9397
## 572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       I specialize in working with individuals and couples who seek to address experiences of trauma, anxiety, depression and more. Professionals of color, creatives, athletes, and fathers are clients that I often walk alongside in therapy. My therapeutic approach is relational and client-centered, using EMDR, Psychodynamic, Culturally Sensitive Therapy, and Mindfulness as primary tools in achieving my clients goals for wellness.
## 575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 220-4465
## 576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Everyone needs support. Whether it’s finding your voice at work, setting boundaries with family or building self esteem-  your goals are valid and it's okay to need support to achieve them.  I provide a non- judgmental space for BIPOC individuals to set goals and process their past and current stressors to identify tools that they can use to feel successful in the future.
## 579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (818) 722-6995
## 580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA , LMFT  
## 582                                                                                                                                                                                                                                                                                                                     Are you looking for a safe place where you can explore and address the issues that you have encountered or continue to encounter on your journey through life, therapy is the place to do so. I am an experienced therapist who works with children, adolescents, adults, couples and families in exploring and addressing issues that may be affecting their lives in various ways. I have worked in human services supporting people in accomplishing their personal goals for over 10 years. My purpose in life is to assist others in discovering the barriers that hinder them from accomplishing their goals and helping them overcome those barriers. 
## 583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 376-5308
## 584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Clinical Social Work/Therapist, LCSW, LMFT, ACSW, AMFT, APCC  
## 586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        AMR Therapy focuses on assisting clients through a social justice and self-empowerment lens. We are a small diverse group of therapists with unique life experiences that informs work with clients.  We know people need a safe space and resources to do therapy, and this is what we strive to provide.
## 587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (650) 643-3825
## 588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Clinical Social Work/Therapist, EdD, MA, LMFT  
## 590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     I specialize in helping people to heal. I am committed to being of service and availing myself to those who need to heal emotional wounds, achieve more clarity, and agency over their lives.
## 591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (747) 203-0729
## 592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              The clients who seek me most are those searching for meaning in the adverse events that have happened to them and their courage to live wholly and fully while suffering. I believe people who are ready for this style of rich internal therapy work are willing to leave the comfort of their suffering to live a more authentic life with grace and flexibility through radical self-acceptance. 
## 595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <NA>
## 596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 598                                                                                                                                                                                                                                                                                                                                                    Welcome! I have been providing counseling to children, teens, and parents from diverse backgrounds for over 7 years. My clinical training has been primarily working with children/teens who are experiencing difficulty maintaining their temper and demonstrate low impulse control. I also have about 10 years experience providing services for children with special needs (learning disabilities, ASD Spectrum). I specialize in providing parenting services to help parents/caregivers learn how to communicate with their children and implement positive behavioral strategies to meet their child’s specific needs.
## 599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 417-8923
## 600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 602                                                                                                                                                                                                                                                                                                                                    Are you a busy student or working professional plagued with anxiety that gets in the way of you fully showing up?  I can help!  My client’s arrive mentally strained and guilt ridden for feeling the way they do.  Anxiety has no regard for who you are or how you grew up.  The anxiety experienced by those with a chaotic home life or history of trauma is no more valid than the anxiety experienced by those with seemingly stress free lives. There is no minimum threshold of suffering required for you to feel valid in seeking help for yourself or your loved one, only the desire to improve and the motivation to do the work.
## 603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (562) 548-7195
## 604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Pre-Licensed Professional, ACSW, MSW  
## 606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Reaching out for help can be one of the hardest things to do when you're struggling the most. What if no one understands you or you feel judged? How do you know you can trust them to take you seriously or care? I understand that these are natural fears when you're sharing the hurt and vulnerable parts of yourself. For this reason, my goal is to make sure you feel safe and heard by providing an empathetic and judgement-free space regardless of your background.
## 607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 879-7938
## 608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist, MA  
## 610                                                                                                                                                                                                                                                                                                                                                                               As a creative woman, you struggle with feeling confident. You know you want to make a change but you’re not sure how. Maybe you’re struggling with deeply rooted issues that make it hard to move forward in life, or how other people perceive you.  Perhaps low self-worth makes it difficult to express yourself creatively. You worry that the way you feel about yourself keeps you from living the life you really want. And you don’t feel like the kind of woman you want to be.  As a creative, you feel like you're failing and the confidence you have in your relationships is eroding.
## 611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 433-6286
## 612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist, MA  
## 614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Have you been putting up with half-assed relationships because it seems better than nothing? Have you been giving your all to everyone and everything around you and wondering when are you going to get something back? Do you look at yourself in the mirror sometimes and say I don't like myself anymore? Have you been noticing that the things that are most important to you get the least amount of time energy and nurturing?
## 615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 342-2277
## 616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, PsyD, LCSW  
## 618                                                                                                                                                                                                                                                                                                                                      I am a licensed clinical social worker in both CA and IL with over nine years of experience as a therapist and life coach. I also have my doctorate in clinical psychology. My counseling style is warm and interactive and rooted in cognitive behavioral therapy and solution-focused therapy. I employ a humanistic, holistic, person-centered, strengths-based, culturally competent approach. I believe in treating everyone with respect, sensitivity, and compassion, and prioritize fostering a healthy therapeutic relationship. I ensure the client is heard, validated, and contributes to their treatment plan and goal setting.
## 619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (818) 962-2824
## 620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Psychological Associate, PsyD  
## 622                                                                                                                                                                                                                                                                                                                                                   Balance is essential to a happy life, and therapy can help you achieve it. Young adults (age 18-39) have so much adjustment in their lives, but need help reaching their potential. These are the best times full of hope and freedom, but are often weighed down by anxiety and feelings of sadness. If you are experiencing difficulties in being a student, an early or transitioning career professional, a new spouse, or working through balancing health, now is the time to move forward. Learn how to develop emotional safety, create balance, recapture your purpose and focus, and improve your performance skills.
## 623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               (310) 496-3450 x109
## 624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 626                                                                                                                                                                                                                                                                                                                                       If you are struggling with grief and loss issues; depression; anxiety; or marriage and family conflicts, or if you are stuck in your spiritual quest, or seeking to break the chains of co-dependent behaviors, then consider giving me a call. I have more than 20 years experience assisting many individuals, families and couples with these urgent life issues. We can, together, begin the journey of getting you un-stuck by using a respectful approach of unconditional positive regard and life coaching methods.  I know what it's like to need help and yet be afraid to reach out.   I want to help you, please call or email.
## 627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 894-2305
## 628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 630                                                                                                                                                                                                                                                                                                                                         I am passionate about working with Adults, Performers, Creative artists, and Professionals in the Entertainment Industry. I specialize in Anxiety, Depression, Life transitions, Dissolving Creative & Career blocks, Overcoming Perfectionism & Imposter Syndrome, Relationship Challenges, School and/or work-related issues, and issues related to self-esteem. I utilize a culturally sensitive, client-centered, and strengths-based approach and believe self-awareness is the first step toward change. I would be honored to support and help you heal and develop a healthier sense of self. I look forward to hearing from you!
## 631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 409-4718
## 632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Clinical Social Work/Therapist, PsyD, LCSW   
## 634                                                                                                                                                                                                                                                                                                                              I enjoy working with individuals and families, helping them to be the best version of themselves.  I am dedicated to helping you achieve your personal and professional goals.  If you desire to be in control of your mental, physical, emotional, and financial well-being...                        Let's work together to set and achieve goals, build healthy coping skills, and develop practical solutions that can empower you in your daily living.                                                                                                       My Motto: Be the “BOSS” of your life, so you can be the best version of yourself.
## 635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 878-0796
## 636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Marriage & Family Therapist Associate, AMFT  
## 638                                                                                                                                                                                                                                                                                                                        Do you experience painful sex, anxiety, struggle with starting or keeping an erection, and ejaculating sooner than you want?Perhaps you have a partner and you are anxious about how to communicate your true feelings or concerns about sex and intimacy. Being authentically you and communicating how you feel can be a real struggle. If this resonates with you, then know that you are not alone. Also, know that your fears are valid; it can feel painful to be rejected, not heard, not seen, and not fulfilled. These struggles are not a reflection of you as a person. They are a sign that there is an area that needs attention and support.
## 639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (747) 529-7693
## 640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, MSW, LCSW  
## 642                                                                                                                                                                                                                                                                                                                         Therapy is a powerful decision to begin the work towards realizing a more whole and fulfilling life. What past events have shaped you and how you experience the world? What patterns or blockages keep you stuck in survival mode and unable to fully thrive? What limiting beliefs continue to impact your relationship with yourself and others? I am a licensed clinical therapist practicing in Los Angeles within a relational, holistic, and person-centered framework. I have 11 years of experience working with those who live with depression, anxiety, trauma, grief, or need support in navigating everyday challenges and life transitions.
## 643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 277-4253
## 644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PsyD  
## 646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Soul-Centered Psychotherapy  —  My work supports your healing and finding your way back from grief, anxiety, and regret to your true, exciting, and unlimited self. Whatever the catalyst, know that in the seeking you are answering your soul’s cry for healing, expression, and expansion. Your journey towards healing and wholeness has already begun. 
## 647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (747) 285-7662
## 648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist Associate, MS, AMFT  
## 650                                                                                                                                                                                                                                                                                                                                              Megan is passionate about advocating for all minority populations and seeks to hold space for and journey with individuals to empowerment and healing. She believes that everyone is capable and deserving of healing and through great insight, removed stigma/shame, and unconditional positive regard one can implement newfound tools to show up more authentically in the world and heal through vulnerability. Previously she worked with a community clinic serving Los Angeles, where she gained experience working with a wide range of ages and populations from kids, teens, young adults, adults, couples, and families.
## 651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 205-0752
## 652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 654                                                                                                                                                                                                                                                                                                                                             Welcome to our group practice. If you are struggling with Depression, Anxiety or Relationship stress, then you have come to the right place.  We offer a safe space to support and treat the problems you are facing.  Whether you are suffering from a recent breakup, feeling anxious or depressed about relationships (family, co-workers, or friends), or just having a hard time coping with life's challenges, we are here to help you get through this.  Our group specializes in creating healthy relationships, working through anxiety, depression, getting "unstuck," working through addictions, and healing from trauma.
## 655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (818) 495-8986
## 656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Clinical Social Work/Therapist, MSW, LCSW, PPSC  
## 658                                                                                                                                                                                                                                                                                                                      A Healing Start Counseling is committed to helping women begin their healing journey toward a healthier, more self-compassionate version of themselves. Navigating feelings of stress, anxiety, and depression can become overwhelming and impact how you show up at work/school, in relationships and your daily life in general. I believe in meeting you exactly where you are, creating a safe and trusting environment so that you feel fully seen and heard. Mindfulness practices are integrated into sessions to help you become aware of what you are truly feeling and help shift you from a negative state- emotions, thoughts, or physical pain.
## 659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 928-9641
## 660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MS, LMFT  
## 662                                                                                                                                                                                                                                                                                                                                                                                                                                                                8/29/22 Accepting New Clients and Couples - You are not alone.  Any of us can be overwhelmed at times and seeking help demonstrates your courage and commitment to yourself.  After your consultation, we will gently help you address those specific areas you feel need to change.  Here, you will learn to look at these challenges with kindness which will allow your heart to access the ability to improve.   These first few steps of your journey are crucial to the ongoing healing you are looking for.
## 663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 629-4269
## 664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        PhD, MFT  
## 666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Personal growth, emotional and mental wellness is possible! We can help whether it’s related to work, anxious thoughts, trauma, family or  relationships. Our approach is tailored to treat the whole person. And to help you thrive!
## 667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 933-9484
## 668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 670                                                                                                                                                                                                                                                                                                                                                                                                         My name is Tanisha Simpson and my clinical experience includes working with children, teens, and adults with severe mental illnesses and individuals in crisis. I am a compassionate, solutions-oriented professional dedicated to providing exceptional care and devising creative treatment plans for children, adolescents and adults dealing with multiple issues. I developed a passion and personal commitment to two things: fostering a positive learning environment for individuals with various backgrounds, and maximizing individual and family performance.
## 671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (951) 420-7370
## 672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Wings of the Future, NFP non-profit that provides treatment for families who are required to complete court ordered psychotherapy/counseling, psychological assessment, and group therapy/classes. Wings of the Future, NFP provides Trauma Informed treatment based on our understanding of Freudian Psychoanalytic approach that various childhood experiences form the basis for adult relationships.
## 675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 (310) 340-2862 x2
## 676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        My integrative approach to therapy is tailored to meet the unique and specific needs of each client.  This therapeutic style helps clients explore core beliefs about themselves and facilitates growth towards inner strength and resilience.  I create space for clients to believe and trust in themselves, and help clients recognize how they respond to internal and external stressors while they navigate feelings of anxiety, depression, and/or childhood wounds
## 679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (626) 469-5102
## 680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Marriage & Family Therapist, PsyD, LMFT  
## 682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Tell me your story, your struggles, your dreams, and we'll work together to heal and transform your life and relationships. My clients can expect a compassionate and collaborative space to heal from past wounds, strengthen their emotional wellness, and improve their relationships for lasting meaningful change. Please visit my website to learn more about how we can work together.
## 683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 929-6713
## 684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist Associate, AMFT, APCC  
## 686                                                                                                                                                                                                                                                                                                                  Building, expanding, & healing a family takes time, work, & support. Through a direct relational approach and empathy development, we will explore what may be triggered by your romantic relationship or the barriers between your mother/daughter relationship so that you may love & connect with more compassion & understanding. Through mindfulness, we will hold space for your anticipation of bringing your little one into the world and your ever-changing experience through pregnancy. Through body awareness & building an intentional self care practice, we will navigate the necessary care and support needed through your postpartum journey.
## 687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 742-8162
## 688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Clinical Social Work/Therapist, LCSW, MA, SAP, CISM  
## 690                                                                                                                                                                                                                                                                                                                                                                                                                           Are you looking to be challenged in a safe environment to promote positive self transformation? Are you looking to build skills and tools to help you build resilience and continue to persevere toward your innate destiny? Are you looking to work with someone for you to tap into your specially tailored plan for growth and development? As a clinician of 10 years who specializes with clientele that have been exposed to trauma, depression, anxiety or work-related stressors. I proudly serve the Los Angeles, Bay Area, and Chicago areas.
## 691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 487-7097
## 692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, LCSW, EMDR  
## 694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Live your truth. Follow your bliss. Do you. Sounds simple, right? Except that, all too often, we convince ourselves that who we are is not enough, that what we want is undeserved. So we stifle our talents, ignore our truth and deny our deepest desires. Before we know it, we’re living someone else’s life, satisfying everyone’s expectations but our own. All to earn the love and acceptance we don’t feel worthy of otherwise. But it doesn’t have to be this way.
## 695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 274-2718
## 696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist Intern, AMFT  
## 698                                                                                                                                                                                                                                                                                                                     I have learned a great deal about you by studying your childhood and the choices you make today as an adult. I find that my clients benefit greatly when they understand the root of their behavior by exploring the essential details of their attachment style. By doing so, you put yourself in a better position to heal from trauma and revise your future social interactions. I work with a supervisor who provides me with the best guidance to help my clients heal from trauma and revise their worldviews. Therapy is a process of understanding, and I believe it is essential for both the client and therapist to be curious about one another.
## 699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 988-1530
## 700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Psychological Associate, PsyD  
## 702                                                                                                                                                                                                                                                                                                                                                                                            Hello my name is Dr. Nekolas “Neko” Milton, I am a Registered Psychological Associate. I have experience working with children, adolescents, and adults. I operate from a client-centered, humanistic approach, focusing on aspects of existentialism, mindfulness, family-systems, multiculturalism, and Cognitive Behavioral Therapy, while keeping careful consideration of cultural concerns and practices. I have experience working with anxiety, depression, trauma-related diagnoses, and incorporate evidenced-based practices to address maladaptive patterns and behaviors.
## 703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (415) 851-8356
## 704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Psychologist, PhD  
## 706                                                                                                                                                                                                                                                                                                                    With over ten years of experience, I have developed a strong expertise in complex trauma and PTSD, with additional specialization in culturally responsive care. I also treat disorders such as OCD, anxiety, and depression that commonly co-occur with trauma.  Additionally, I have worked in corporate environments helping people to overcome feelings of imposter syndrome, work-life balance,  burnout, and relationship and identity development. This journey will include deep introspection, honest compassionate feedback, tears, and even some laughter.  Through the pain, the change, and the victories, I will be there every step of the way.
## 707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (786) 347-8405
## 708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 710                                                                                                                                                                                                                                                                                                                                                                                    Life can be challenging or uncertain at times.  When you feel overwhelmed or unprepared for a life challenge, it may be good to seek the support of a trained professional.  I am prepared to support those who are grieving from a personal loss, including death, loss of a relationship, transitioning jobs, and other losses.  Grief can have a significant impact on one's life and physical health.  It can drain you of the energy needed to move forward in your life.  Contact me for further information on how I can support you in reaching your goals of improved mental health. 
## 711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (615) 909-5600
## 712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Marriage & Family Therapist, LMFT, AMFT  
## 714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Our Mission Capricorn Counseling Center’s mission is to provide the people of California quality and consistent mental health care services that is reachable, affordable, specialized, and socially conscious. Our Clinicians have openings and can accept you right away!
## 715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (805) 273-8039
## 716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, LMFT, BSW  
## 718                                                                                                                                                                                                                                                                                                                                                                                                                                                  Whatever your troubles no one should have to do it alone. Are parental issues a problem? Are you having marital issues? Do you have anxiety? Let's work together to reduce your episodes of anxiety. Do you suffer from depression? Allow our team to assist in improving the quality of your life. If your life generally feels out of control, let's work together to gain that control back. If you're going through a phase of life transition and find it difficult to navigate decisions and relationships... we can help.
## 719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (909) 655-5145
## 720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist Associate, AMFT, APCC  
## 722                                                                                                                                                                                                                                                                                                                  Building, expanding, & healing a family takes time, work, & support. Through a direct relational approach and empathy development, we will explore what may be triggered by your romantic relationship or the barriers between your mother/daughter relationship so that you may love & connect with more compassion & understanding. Through mindfulness, we will hold space for your anticipation of bringing your little one into the world and your ever-changing experience through pregnancy. Through body awareness & building an intentional self care practice, we will navigate the necessary care and support needed through your postpartum journey.
## 723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 742-8162
## 724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MS, LMFT  
## 726                                                                                                                                                                                                                                                                                                                                                                                               My therapeutic style is eclectic, meaning I can pull from a variety of modalities for identifying and treating trauma and its effects, on both the individual, and the family unit. Building rapport is essential because we tend to do our best when we are having fun. I utilize a personal and individual approach to therapy focusing on determining “cause” behind each client’s distress.  I also provide group counseling to those struggling with Anger Management, Anxiety, Relationship issues, and a group specifically for Church Pastors affected by secondary trauma.
## 727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (951) 228-5432
## 728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, PhD, PsyD, LCSW, LMFT, YTT  
## 730                                                                                                                                                                                                                                                                                                                                                                             Wellplace's compassionate and skilled therapists can help if you're struggling with: chronic perfectionism and self-esteem issues, relationships, grief and loss, work/life balance, life transitions, self-growth, imposter syndrome, codependence, attachment issues, stress and anxiety, depression, substance use and addiction, or trauma. Utilizing evidence-based therapy models, including Cognitive Behavioral Therapy (CBT) and Mindfulness-Based Cognitive Therapy, your Wellplace therapist will work with you to form an individualized plan to help improve your life in concrete ways.
## 731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (415) 300-4033
## 732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Clinical Social Work/Therapist, DSW, MSW, LICSW, LCSW-C, LCSW  
## 734                                                                                                                                                                                                                                                                                                                                   At Elite Behavioral Therapy, I believe you are the author of your own experience and the expert on your own life. But sometimes even experts need advice. Perhaps you have wondered why there isn’t a how-to manual for your own life. Or thought that others seem to know the secret ingredient to the recipe for a successful relationship. There is no magical formula for happiness. But I can be your guide, and help you dispel the myths and negative stories that you have told yourself that's getting in the way of your happiness. Worries, stresses, joy, and hopes? I can help you better manage the conflicts everyone struggles.
## 735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (301) 690-0336
## 736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Wings of the Future, NFP non-profit that provides treatment for families who are required to complete court ordered psychotherapy/counseling, psychological assessment, and group therapy/classes. Wings of the Future, NFP provides Trauma Informed treatment based on our understanding of Freudian Psychoanalytic approach that various childhood experiences form the basis for adult relationships.
## 739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 (310) 340-2862 x2
## 740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              I can provide a space to process, offer alternate points of view for reflection, and collaboratively find solutions to meet support needs. Having the experience of working with people at all levels of care, I understand how mental health is impacted by life changes, physical ailments, and social challenges.
## 743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (909) 324-5338
## 744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, LCSW, EMDR  
## 746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Live your truth. Follow your bliss. Do you. Sounds simple, right? Except that, all too often, we convince ourselves that who we are is not enough, that what we want is undeserved. So we stifle our talents, ignore our truth and deny our deepest desires. Before we know it, we’re living someone else’s life, satisfying everyone’s expectations but our own. All to earn the love and acceptance we don’t feel worthy of otherwise. But it doesn’t have to be this way.
## 747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 274-2718
## 748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, LMFT, BSW  
## 750                                                                                                                                                                                                                                                                                                                                                                                                                                                  Whatever your troubles no one should have to do it alone. Are parental issues a problem? Are you having marital issues? Do you have anxiety? Let's work together to reduce your episodes of anxiety. Do you suffer from depression? Allow our team to assist in improving the quality of your life. If your life generally feels out of control, let's work together to gain that control back. If you're going through a phase of life transition and find it difficult to navigate decisions and relationships... we can help.
## 751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (909) 655-5145
## 752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 754                                                                                                                                                                                                                                                                                                                                                                                                                                                  With the constantly changing landscape of society and the world, I offer clients dealing with anxiety, depression, trauma, insomnia, life circumstance change, cultural differences and difficulties, a stable landing board in which to process their reactions, feelings, and thoughts during these often challenging times. The approaches to therapy I incorporate include psychodynamic, existential, family systems, meaning-centered, and cognitive behavioral, all while coming from a trauma-informed care perspective.
## 755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (800) 825-9989
## 756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 758                                                                                                                                                                                                                                                                                                                                                                                    Life can be challenging or uncertain at times.  When you feel overwhelmed or unprepared for a life challenge, it may be good to seek the support of a trained professional.  I am prepared to support those who are grieving from a personal loss, including death, loss of a relationship, transitioning jobs, and other losses.  Grief can have a significant impact on one's life and physical health.  It can drain you of the energy needed to move forward in your life.  Contact me for further information on how I can support you in reaching your goals of improved mental health. 
## 759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (615) 909-5600
## 760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Life can be difficult. Often what we envisioned for ourselves is not matching the reality. We feel overwhelmed, sad, angry, we question ourselves and sometimes life itself. This can be lonely. A client and therapist relationship is key to creating a sense of comfort and trust for clients to open up, talk about their situation,  discover their true thoughts and feelings, begin to heal, and feel empowered to handle whatever life puts before them.
## 763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (714) 984-6729
## 764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Clinical Social Work/Therapist, LCSW, CMF, CSAT  
## 766                                                                                                                                                                                                                                                                                                                                        To put it simply, I love people. And what inspires me as a therapist is the opportunity to serve others through authentic connection and collaborative insight into clients' thoughts, feelings and actions. While drawn to cognitive behavioral and Mindfulness interventions, for me, providing a safe, warm and open relational component is key. Whether working with couples, individual adults or adolescents, and issues ranging from anxiety, depression, trauma, or sexuality, intimacy and interpersonal functioning, it is a privilege to hold your confidence and assist you in your journey towards integration and wellness.
## 767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 870-8224
## 768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Marriage & Family Therapist, LMFT, MA, MEd  
## 770                                                                                                                                                                                                                                                                                                                        You’re pretty resilient but life has thrown you a curve ball. Maybe you’ve recently experienced a major transition (marriage/divorce, birth/death, aging, job loss/gain) or; your identity disrupts essential relationships (sexual orientation, religious affiliation, loving outside your race/ethnicity). Maybe a societal ill is beyond your control (racism, sexism, implicit bias, global pandemic). Your spouse/partner, boss, family or a friend has noticed it too but; you can't seem to talk to them about what's happening or you don't feel understood by them when you do. All you want is to feel better and tolerate life's ups and downs.
## 771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (626) 314-6310
## 772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    I get it.  Deciding to go to therapy can be a tough decision.  We’ve become conditioned to believe that therapy is for “other people” and just not for us. Often times, we were not provided the tools we needed to handle our emotions which can leave us feeling overwhelmed, depressed, anxious and alone.  I encourage you to take the time to emotionally invest in yourself so that you can nurture happy, healthy relationships with yourself and those close to you.  
## 775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (562) 269-1584
## 776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Licensed Clinical Professional Counselor, PhD, LCPC, NCSP, NCC, ACS  
## 778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Thank you for seeking a therapist for support along your journey. Unfortunately, I am not taking on new clients at this time. Please continue your journey and find the right therapist for you.
## 779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (301) 658-2081
## 780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, PhD, LMFT  
## 782                                                                                                                                                                                                                                                                                                                                                                     Hi, I'm Dr. Brookins licensed marriage and family therapist. I'm also a senior pastor's wife and I specialize in counseling Christian women. Growing up in the church I understand first hand, the sensitive and often complex needs of Christian believers. And as a skilled licensed mental health professional, I also understand that our mental health matters.  And, Jesus does not want us to suffer. As a Strengths-Based therapist, I utilize CBT, EMDR, and Solution Focused interventions in treatment. I also offer a variety of coaching packages specifically designed for the Christian woman.
## 783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (559) 234-4677
## 784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 786                                                                                                                                                                                                                                                                                                                                                                                                                    Rogers Brand Therapies - My brand of Psychotherapy includes: Tim Rogers Therapy (Individuals), Trust in Me Therapy (Couples) and Rogers Family Therapy (Families). Within each therapeutic approach, my objective is one which uses psychology, philosophy and spirituality as a way to support you as you allow room to show up for yourself first then others, just as you are. I hope to help you to connect to your true self in order to create more emotional stability and consistent confidence as you navigate ALL of the relationships in your life.
## 787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (310) 997-4680
## 788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Licensed Professional Counselor, MS, LPCC  
## 790                                                                                                                                                                                                                                                                                                                     Richard Sypniewski is a Licensed Professional Clinical Counselor (LPC343) who treats a wide range of mental health and personal issues. He has worked as a School Counselor since 2005, has experience at the college level as Adjunct Faculty and as a Community College Counselor and as Adjunct Faculty in the CSUSB Educational Psychology and Counseling Narrative program teaching coursework related to the LPCC Clinical License. He has been trained in working with adults and children experiencing emotional disorders and has a wide range of life experiences rooted in helping individuals from a variety of backgrounds and age demographics.
## 791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (760) 565-5983
## 792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, LCSW, BCD  
## 794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      We realize contacting a therapist can be anxiety provoking.  At Cauley & Associates, we cover a wide-range of services/issues that are common in everyday life.  Prior to scheduling an appointment, we will have an initial consultation over the phone to get a sense of the issue and determine if we are a good fit or if a referral should be provided.
## 795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 570-5986
## 796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              MA  
## 798                                                                                                                                                                                                                                                                                                                                                                                                 I am a certified sex and dating coach who helps individuals and couples of all kinds overcome sexual concerns like mismatched desire, low desire and sexual communication difficulties. My clients see an increase in the quality of their sexual interactions with partners and more confidence to ask for what they need after working with me. I also provide individual dating coaching to help people find the right partners and navigate the tricky waters of online dating. I identify as a feminist and work with all genders, orientations and relationship structures.
## 799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (628) 800-0823
## 800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Clinical Social Work/Therapist, DBH, LCSW, MSW  
## 802                                                                                                                                                                                                                                                                                                                                                           Welcome to Behavioral Health Solutions (BHS) 365, INC. Congratulations on taking the first step towards creating the business of your dreams! Have you always been an entrepreneur at heart, but doubted your ability to start a business? Do you have a viable business idea that you want to materialize? Do your draw outside the lines? If you answered yes to these questions, welcome!  I have helped many people just like you create successful businesses. As your talent & business coach I'll equip you with the tools necessary to achieve your goals. Let's partner! Call today for a meet & greet, on me.
## 803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (619) 566-1210
## 804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, LCSW, BCD  
## 806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      We realize contacting a therapist can be anxiety provoking.  At Cauley & Associates, we cover a wide-range of services/issues that are common in everyday life.  Prior to scheduling an appointment, we will have an initial consultation over the phone to get a sense of the issue and determine if we are a good fit or if a referral should be provided.
## 807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 570-5986
## 808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     We all have what we need to change within us...we just need someone to help us bring it out. And I would like to be that someone for you. I work with adolescents and adults, from various cultural and socioeconomic backgrounds, assisting them with decreasing emotional discomfort while increasing coping skills and building self-esteem/confidence to help manage life's challenges at school, home, work and with relating to others.
## 811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (818) 614-9362
## 812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 814                                                                                                                                                                                                                                                                                                                                                                                                         Do you feel disconnected from yourself? Like you're just not "you" anymore or you're not sure who you are now? Maybe you are in an abusive relationship, just left one, or have undergone a traumatic event or major life transition. You need help rediscovering and reconnecting with yourself. You might feel disappointed with what your life looks like and where you are headed in life. Depression and anxiety have taken the forefront in your life and you want a way back to feeling like yourself, a way back to feeling healthy and interested in life again.
## 815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 894-9285
## 816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PsyD  
## 818                                                                                                                                                                                                                                                                                                                                     As a psychologist, I believe that establishing a good working relationship with my client is first and foremost.  I will support and challenge you to address your concerns, such as relationship difficulties, work-life balance struggles, or chronic anxiety or depression. In order to facilitate a meaningful change, I utilize a holistic/integrated approach when working with my clients.  Meaning, I believe that change happens not only when your mind is the focus of treatment and change, but also the body.  Therefore, I offer the option of sessions that focuses on the mind-body connection or traditional talk therapy.  
## 819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (347) 657-3242
## 820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          You’ve finally made it in your career but the hurdles to get there have felt endless.  You’ve tried to disconnect from the pain of being othered on a consistent basis, but the hurt and anger still remains. How long have you had to work twice as hard to be on equal footing with other colleagues? As a BIPOC therapist I know what it’s like to navigate this experience and how effective it feels when you can dive right in with a mental health professional who just gets it.
## 823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (323) 521-5713
## 824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 826                                                                                                                                                                                                                                                                                                                                                                                                                                                           Therapy is, at times taboo and it has been relegated to "crazy" people, it's for everyone. In a world that has been shut down and many are uncertain just know you are not alone. If you're finding yourself in limbo, decreasing in mood, and just need additional support during this time don't hesitate to ask for help. As a therapist but most importantly as a human my ability to connect and relate with almost anyone no matter your race, gender, culture, sexual orientation, socioeconomic status, or age.
## 827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 297-1289
## 828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 830                                                                                                                                                                                                                                                                                                                                                                                                                                                    Many of us have had to adjust to a new type of reality that has restricted our ability to connect with family, friends, coworkers, and the general population due to the Covid-19 pandemic. There is a cloud of uncertainty that tells us that life as we once knew it has forever shifted in how we function as a society. Social distancing has become our new normal. For many of us, this current crisis has only compounded issues we have been struggling with for years. Now is the time to make a change for yourself.
## 831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (909) 639-3401
## 832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Clinical Social Work/Therapist, MBA, MSW, LCSW  
## 834                                                                                                                                                                                                                                                                                                                                               A person plays many roles over the course of one’s life; some fill the role of a Lover, or a Fighter, Mother or Father, Sister, Brother, or Friend. No matter what role you currently play, the world may have pulled you away from the most important role you can play, which is the role of developing the best version of YOU, that's possible. My approach is based on embracing each person as a whole being, and by learning and growing together through the therapeutic relationship. This allows my clients to find and reembrace their true selves, as they redefine and refresh the roles they play in their own lives.
## 835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (562) 207-5564
## 836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Marriage & Family Therapist, PsyD, LMFT, BCBA  
## 838                                                                                                                                                                                                                                                                                                                                                                                                                             I specializes in MFT and ABA. While working with clients, I supports their work by identifying behavior patterns, identifying healthy replacement behaviors, and support my client’s understanding of emotional and cognitive states. Through the understanding of the self, my clients learn how their behaviors impact their environments. And more importantly how they can make changes to enhance their life, relationships, and experiences in their daily environments. I have experience working with adults, couples, groups, and children. 
## 839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 329-4718
## 840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, MSW, LCSW  
## 842                                                                                                                                                                                                                                                                                                                                                           Hello! Thank you for taking the first step towards change, growth and healing.  I am here to help you in overcoming life’s challenges that are impacting your emotional well-being, your relationships, and your day to day functioning. As an experienced therapist, I am here to support you in identifying the tools and resources you already possess as well as introducing new coping skills to manage a variety of  feelings and emotions that are impacting  your ability to cope. I believe that everyone has the ability to heal and grow and I work collaboratively with you in your journey to well-being. 
## 843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 363-4855
## 844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 846                                                                                                                                                                                                                                                                                                                                                                    Congratulations for taking the first step towards change! I utilize many methods with clients during sessions (expressive arts therapy, narrative therapy, trauma focused therapy, positive psychology, videos, worksheets, etc.) Change does take work but it can happen! I sometimes give homework to help my clients achieve their goals. I mainly work with adults (18+) as individuals and as couples (couples counseling includes a parent and adult child, adult siblings, or intimate partnerships). Whether it's anxiety, trauma, stress, or a mixture of things, I look forward to working with you!
## 847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (951) 400-4481
## 848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MS, LMFT  
## 850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   The journey of life can be a challenging one. We are often faced with situations and events that challenge us. Sometimes we feel alone, confused, uncertain, or afraid. We seek comfort and understanding. We want change, but are not sure how or what steps to take. We seek safety, security, and purpose. I will help you navigate through life challenges and help you gently face your deepest struggles.
## 851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (714) 627-4897
## 852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Counselor, PsyD, LPCC  
## 854                                                                                                                                                                                                                                                                                                                                                                                                                            Have you been in a relationship with someone who has been identified as a narcissist? Did your partner have little concern for your feelings and turn your world upside with chaos, conflict, abuse, and poor boundaries? You wonder what was wrong with you, why did things end this way, and if the universe working against you because people in your life seem unreliable, manipulative, and inconsistent. Distrust of others and pain seem to be your life's theme right now. You long for a safe place to connect with someone who understands.
## 855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (415) 322-5527
## 856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Psychological Associate, PsyD  
## 858                                                                                                                                                                                                                                                                                                                                                             Hello my name is Dr. Nekolas “Neko” Milton, I am a registered psychological associate supervised by Dr. David Sheperd. I have experience working with children, adolescents, and adults. I operate from a client-centered, humanistic approach, focusing on aspects of existentialism, mindfulness, family-systems, multicultralism, and Cognitive Behavioral Therapy, while keeping careful consideration of cultural concerns and practices. I have experience working with anxiety, depression, trauma-related diagnoses, and incorporate evidenced-based practices to address maladaptive patterns and behaviors.
## 859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (415) 799-5848
## 860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Psychologist, EdD  
## 862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               You made the decision to go to therapy because you want to make some changes in your life, but what's next? You may be feeling confused, embarrassed, or unsure of where this journey may lead you.
## 863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (909) 340-2436
## 864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Associate Professional Clinical Counselor, MA, APCC  
## 866                                                                                                                                                                                                                                                                                                                   Do you feel stress and anxiety from the sport that you play. Do you feel constant pressure to perform at your best and the results are not showing the way you want? Do you find it hard to relax and to find a sense of calmness while you perform? if you answered yes to those questions or just feel you are not yourself then therapy can be a great solution to getting you back in stride. I like to include a lot of of mindfulness and relaxation skills when we work together. I also use Hypnotherapy as well and give you the tools to be able to find your zone and perform at a higher level. I am open to all sports and all levels of athletes.
## 867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 317-9969
## 868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 870                                                                                                                                                                                                                                                                                                                              Selena McQueen is a marriage and family therapist with over 19 years of clinical experience serving individuals of many cultures and beliefs with achieving positive lifestyle changes. Selena will explore with you, and question thought patterns and habits that can often result in experiencing anxiety, depression and other distresses in life that create emotional barriers to having effective and meaningful relationships. She encourages use of goal setting, and practice of clinical interventions outside of the therapy space to affect the removal of emotional struggles and facilitate new perspectives and ways of functioning.
## 871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 772-4921
## 872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PsyD  
## 874                                                                                                                                                                                                                                                                                                                              A life transition experience can be positive or negative, planned or unexpected. Some transitions happen without warning, and they may be quite dramatic, as in cases of accidents, death, divorce, job loss, or serious illness. Other life transitions come from positive experiences such as getting married, going away to college, starting a new job, moving to a new city. Even though events like these are usually planned and anticipated, they can be just as life-altering as the unexpected events. Whether positive or negative, life transitions cause us to leave behind the familiar and force us to adjust to new ways of living. 
## 875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 233-1157
## 876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Marriage & Family Therapist, MA, LMFT, ATR  
## 878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Disconnected, frustrated, overwhelmed, confused, drained, or just a general sense of blah….sound like you? Let’s talk about it. That is really what therapy boils down to.. talking to an objective and open-minded person with the professional skills to help you find your way.  It’s difficult to see through the storm when you’re in the middle of it. That’s where I come in. Standing outside of your storm to help you find your way through.
## 879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (661) 218-1356
## 880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      MSW, ASW, APCC, AMFT, LCSW  
## 882                                                                                                                                                                                                                                                                                                                      Our team of Clinical Social Workers, Marriage and Family Therapist, Professional Clinical Counselors help identify psychosocial barriers, and empower individuals to overcome those obstacles for positive, healthy change. The pursuit of happiness, security, and a life filled with dignity sometimes requires support. Here at Social Work Support, we help you navigate through complicated life stressors. We use our social work knowledge so that you make the best possible decisions for your situation. Using a strength-based approach, blended with feedback informed care and motivational interviewing, we support you through those moments.
## 883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (209) 340-0681
## 884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, MSW, LCSW  
## 886                                                                                                                                                                                                                                                                                                                                                           Hello! Thank you for taking the first step towards change, growth and healing.  I am here to help you in overcoming life’s challenges that are impacting your emotional well-being, your relationships, and your day to day functioning. As an experienced therapist, I am here to support you in identifying the tools and resources you already possess as well as introducing new coping skills to manage a variety of  feelings and emotions that are impacting  your ability to cope. I believe that everyone has the ability to heal and grow and I work collaboratively with you in your journey to well-being. 
## 887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 363-4855
## 888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MS, LMFT  
## 890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   The journey of life can be a challenging one. We are often faced with situations and events that challenge us. Sometimes we feel alone, confused, uncertain, or afraid. We seek comfort and understanding. We want change, but are not sure how or what steps to take. We seek safety, security, and purpose. I will help you navigate through life challenges and help you gently face your deepest struggles.
## 891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (714) 627-4897
## 892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Marriage & Family Therapist, PsyD, MA, LMFT  
## 894                                                                                                                                                                                                                                                                                                                                                              Welcome, I know it takes a lot of strength to begin your journey towards healing; people need one another through both good and challenging times. I provide a number of specialized therapeutic services to those dealing with a variety of life challenges. I work with many individuals from all walks of life and work with a variety of presentations including trauma, depression, anxiety, mood disorders, identity conflicts, grief and loss, phase of life concerns, etc. Our goal together will be to increase insight, quality of life, navigate future uncertainties and recover from past experiences."
## 895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 377-2941
## 896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             PhD  
## 898                                                                                                                                                                                                                                                                                                                        We provide a holistic mental health coaching/counseling committed to personal, social and professional growth. Our professionals are expert professors, PhD, MA, BS in the field of health and counseling, and serving clients of all ages, and organizations for more than 20yrs.The center provides: 1- life coaching to women for varied health concerns: Skin & Acne care, girls maturation, over/under weight issues; Food addiction/Nutritional concerns; Reproductive and sexual Mental health; Adaptation to pregnancy; Postpartum challenges;  Dealing with menopause challenges;  Dealing with aging process; health concerns, chronic diseases.
## 899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (617) 744-7497
## 900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Marriage & Family Therapist, MA, LMFT, ATR  
## 902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Disconnected, frustrated, overwhelmed, confused, drained, or just a general sense of blah….sound like you? Let’s talk about it. That is really what therapy boils down to.. talking to an objective and open-minded person with the professional skills to help you find your way.  It’s difficult to see through the storm when you’re in the middle of it. That’s where I come in. Standing outside of your storm to help you find your way through.
## 903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (661) 218-1356
## 904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, LCSW, MSW  
## 906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Hey sis! Are you tired of feeling overwhelmed? Does your life seem likes its in shambles? Are you barely holding on by a thread just to get through the day? Listen, I get it and most importantly, I get you. You are not lazy. You are not angry. You are not bitter. What you are is overwhelmed, stressed, and probably anxious. You need an outlet and a trusted place where you can let your hair down and release all that's bottled up.
## 907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (661) 768-1757
## 908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Marriage & Family Therapist, MS Ed, MFT  
## 910                                                                                                                                                                                                                                                                                                                                          Your everyday choices reflect the meaning you are attempting to bring to your life. Big or small, they are rooted in your in past, hopes, desires, needs, dreams, etc. There are times, however, when you experience trauma, severe life stressors, or times of crisis that impact your ability to make healthy choices producing confusion, fear, anger, and sadness. You may even feel as if it is a struggle to find ease, happiness, and peace. The journey to be more self-aware,  to bring more contentment and joy in your life and to connect with others in healthy ways is the destination that you and I will strive towards.
## 911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (415) 949-7934
## 912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Associate Professional Clinical Counselor, APCC  
## 914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      You are NOT alone. By communicating and using resources, you learn a better sense of Self and Community. This is your "sign" to start therapy Today! I'm here for those individuals that no longer want stigmas, fear, and negative thoughts stopping them from being their best self and achieving personal goals. Access my calendar and book your appointment using this Calendly link: https://calendly.com/s-rogersapcc
## 915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (714) 735-0431
## 916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 918                                                                                                                                                                                                                                                                                                                                   Are you ready to grow, move forward, make a change? Are you fully living or just existing? Does life seem overwhelmingly difficult at times? Or maybe just the opposite and it seems rather underwhelming and meaningless? Are you struggling in your relationships with friends, family or romantic partners? Wondering if some relationships are fading out for good or if it can be revived after all this time? Wherever you currently are, I can help. Together, we can create a plan and I will provide a counseling experience that meets your specific needs and helps you grow to your fullest potential in all aspects of your life. 
## 919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (626) 314-7108
## 920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Counselor, DMin, EdD, NBCC  
## 922                                                                                                                                                                                                                                                                                                                                                                                                                      I engage well with clients from varying ethnicities, and clients that might describe their experience as unique. I also have a number of celebrity clients, pastors and wives, business owners and couples who seek someone to be honest and direct. I don't believe in wasting time in session and "running the clock." Our experience will be intense, refreshing, and reflective. If you are seeking out a therapist that others can identify your change and development, then if schedule permits, perhaps we will have a spirit experience in session.
## 923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (346) 762-2930
## 924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Marriage & Family Therapist, MA , LMFT   
## 926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     I am a Licensed Marriage and Family Therapist practicing in Kern County.  I have treated both adults, adolescents, and couples who have struggled with depression, anxiety, PTSD, grief, bipolar, ODD, and relational stressors.  I also enjoy working with transitional youth between the ages of 16-21yrs old assisting with goal setting and developing meaningful living.  I further have experience working with clients on spiritual and faith matters.
## 927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (661) 475-8072
## 928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PsyD  
## 930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Do you feel unseen or unknown?  Do you feel discombobulated after a life change?  Do you feel stuck in a relational pattern?  Do you know you need some help but find it so hard to reach out for it?  Life always throws curveballs and I would like to walk with you through the hard times.
## 931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (503) 852-5099
## 932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Psychologist, EdD  
## 934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               You made the decision to go to therapy because you want to make some changes in your life, but what's next? You may be feeling confused, embarrassed, or unsure of where this journey may lead you.
## 935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (909) 340-2436
## 936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PsyD  
## 938                                                                                                                                                                                                                                                                                                                              A life transition experience can be positive or negative, planned or unexpected. Some transitions happen without warning, and they may be quite dramatic, as in cases of accidents, death, divorce, job loss, or serious illness. Other life transitions come from positive experiences such as getting married, going away to college, starting a new job, moving to a new city. Even though events like these are usually planned and anticipated, they can be just as life-altering as the unexpected events. Whether positive or negative, life transitions cause us to leave behind the familiar and force us to adjust to new ways of living. 
## 939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 233-1157
## 940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 942                                                                                                                                                                                                                                                                                                                         Life has many challenges, twists, and turns that sometimes create unwanted feelings. Lately, you have noticed that you have been living in survival mode or maybe you have not been happy for a long time. Taking steps toward figuring this out and making progress towards change has been difficult. The desire is there, but something keeps holding you back from the ideal you, the ideal life, the ideal peace. Even though I am a therapist, I am human and experience life just as everyone else does. Because of my life experiences I am able to relate to so many situations we experience in life. My focus is to help you reach your goals.
## 943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (562) 620-5879
## 944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Counselor, PsyD, LPCC  
## 946                                                                                                                                                                                                                                                                                                                                                                                                                            Have you been in a relationship with someone who has been identified as a narcissist? Did your partner have little concern for your feelings and turn your world upside with chaos, conflict, abuse, and poor boundaries? You wonder what was wrong with you, why did things end this way, and if the universe working against you because people in your life seem unreliable, manipulative, and inconsistent. Distrust of others and pain seem to be your life's theme right now. You long for a safe place to connect with someone who understands.
## 947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (415) 322-5527
## 948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Clinical Social Work/Therapist, MBA, MSW, LCSW  
## 950                                                                                                                                                                                                                                                                                                                                               A person plays many roles over the course of one’s life; some fill the role of a Lover, or a Fighter, Mother or Father, Sister, Brother, or Friend. No matter what role you currently play, the world may have pulled you away from the most important role you can play, which is the role of developing the best version of YOU, that's possible. My approach is based on embracing each person as a whole being, and by learning and growing together through the therapeutic relationship. This allows my clients to find and reembrace their true selves, as they redefine and refresh the roles they play in their own lives.
## 951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (562) 207-5564
## 952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PsyD  
## 954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Are you feeling stressed and overwhelmed? Do you desire more fulfilling relationships? Are you looking for ways to take care of yourself from the inside out? We can work together to create healthy boundaries, find a better balance, establish more effective coping skills, and develop more meaningful relationships.
## 955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (832) 662-5892
## 956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 958                                                                                                                                                                                                                                                                                                                                                     I’m Danielle Gautt, a Licensed Clinical Social Worker (LCSW) from Inglewood, California, and the creator of Emerge Counseling, Consultation, and Wellness Services. My life’s passion is to help empower Women of Color to unlock their healthiest and happiest version of themselves. Whether you are struggling through a life transition, experiencing race-based stress, or managing mental health concerns like anxiety or depression, our shared goal is to connect you to the best version of yourself. I believe that identity shapes our experiences and that developing awareness allows our true selves to emerge.
## 959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (408) 418-2467
## 960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 962                                                                                                                                                                                                                                                                                                                                                                      Life can be daunting.  Often leaving us feeling depressed, overwhelmed and anxious. You may be dealing with grief, loss or something else.  Don't feel  alone.  Let us collaborate and help you work through whatever challenges you may be facing.  I provide you a safe space of compassion, that is free from judgement. A place of empathy, support and acceptance, irrespective of who you are , what your thoughts are and what you may have done in the past. It's a   place where you can expect to be received and accepted as you are. We will work on helping you understand your inner workings.
## 963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (209) 219-2376
## 964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PsyD  
## 966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Do you feel unseen or unknown?  Do you feel discombobulated after a life change?  Do you feel stuck in a relational pattern?  Do you know you need some help but find it so hard to reach out for it?  Life always throws curveballs and I would like to walk with you through the hard times.
## 967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (503) 852-5099
## 968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Clinical Social Work/Therapist, LCSW  
## 970                                                                                                                                                                                                                                                                                                                                                                    Congratulations for taking the first step towards change! I utilize many methods with clients during sessions (expressive arts therapy, narrative therapy, trauma focused therapy, positive psychology, videos, worksheets, etc.) Change does take work but it can happen! I sometimes give homework to help my clients achieve their goals. I mainly work with adults (18+) as individuals and as couples (couples counseling includes a parent and adult child, adult siblings, or intimate partnerships). Whether it's anxiety, trauma, stress, or a mixture of things, I look forward to working with you!
## 971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (951) 400-4481
## 972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Clinical Social Work/Therapist, MBA, LICSW, LCSW, BCD, CCTP-II  
## 974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     When it comes to working with clients, I like to meet them where they are at. My goal is to enter into a therapeutic alliance with my client and have the opportunity to explore their presenting concerns and together explore solutions or a different way of looking at the presenting issue. At times, clients come to into therapy for a resolution, support, compassion, a different perspective, and most importantly validation. I am here to support a client through this process. 
## 975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (610) 624-8513
## 976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, MSW, LCSW  
## 978                                                                                                                                                                                                                                                                                                                    I believe everyone has the capacity to achieve their goals and become their authentic self.  My approach to therapy involves empowering individuals to better understand themselves and tap into inner resources needed to heal and make desired life changes.  I focus on helping you develop a deeper exploration of who you are and help you understand obstacles and trauma getting in the way of you achieving what you desire in life.   We cannot change the past, but together we can work together to create a better future. Therapy is difficult self -work, but I will work alongside you to create the space to promote healing and empower you. 
## 979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (626) 590-7026
## 980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Drug & Alcohol Counselor, BGS, SAP, LCDC, ADC III, ICADC  
## 982                                                                                                                                                                                                                                                                                                                           I am a qualified Substance Abuse Professional, known as a SAP or QSAP. I  provide substance abuse evaluations for Federal Department of Transportation entities, including the FAA, FMCSA, PHMSA, FRA, FTA, and the Maritime Administration.  These employees include CDL drivers, bus drivers, oil/gas/pipeline workers, railroad, US Coast Guard, etc.  I also provide substance abuse evaluations for Probation and Parole clients, attorneys, courts, private companies, and DPS and Department of Motor Vehicle departments in all states across the country. Another service provided by my office is the DWI Repeat Offender Intervention class.
## 983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (817) 769-3725
## 984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, LMFT  
## 986                                                                                                                                                                                                                                                                                                                                                                                                                                                    Many of us have had to adjust to a new type of reality that has restricted our ability to connect with family, friends, coworkers, and the general population due to the Covid-19 pandemic. There is a cloud of uncertainty that tells us that life as we once knew it has forever shifted in how we function as a society. Social distancing has become our new normal. For many of us, this current crisis has only compounded issues we have been struggling with for years. Now is the time to make a change for yourself.
## 987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (909) 639-3401
## 988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, LMFT  
## 990                                                                                                                                                                                                                                                                                                                              Selena McQueen is a marriage and family therapist with over 19 years of clinical experience serving individuals of many cultures and beliefs with achieving positive lifestyle changes. Selena will explore with you, and question thought patterns and habits that can often result in experiencing anxiety, depression and other distresses in life that create emotional barriers to having effective and meaningful relationships. She encourages use of goal setting, and practice of clinical interventions outside of the therapy space to affect the removal of emotional struggles and facilitate new perspectives and ways of functioning.
## 991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (213) 772-4921
## 992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Associate Professional Clinical Counselor, APCC  
## 994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      You are NOT alone. By communicating and using resources, you learn a better sense of Self and Community. This is your "sign" to start therapy Today! I'm here for those individuals that no longer want stigmas, fear, and negative thoughts stopping them from being their best self and achieving personal goals. Access my calendar and book your appointment using this Calendly link: https://calendly.com/s-rogersapcc
## 995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (714) 735-0431
## 996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  
## 997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Marriage & Family Therapist, PsyD, MA, LMFT  
## 998                                                                                                                                                                                                                                                                                                                                                              Welcome, I know it takes a lot of strength to begin your journey towards healing; people need one another through both good and challenging times. I provide a number of specialized therapeutic services to those dealing with a variety of life challenges. I work with many individuals from all walks of life and work with a variety of presentations including trauma, depression, anxiety, mood disorders, identity conflicts, grief and loss, phase of life concerns, etc. Our goal together will be to increase insight, quality of life, navigate future uncertainties and recover from past experiences."
## 999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    (424) 377-2941
## 1000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 1002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  The journey of life can be a challenging one. We are often faced with situations and events that challenge us. Sometimes we feel alone, confused, uncertain, or afraid. We seek comfort and understanding. We want change, but are not sure how or what steps to take. We seek safety, security, and purpose. I will help you navigate through life challenges and help you gently face your deepest struggles.
## 1003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (714) 627-4897
## 1004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 1006                                                                                                                                                                                                                                                                                                                                                          Hello! Thank you for taking the first step towards change, growth and healing.  I am here to help you in overcoming life’s challenges that are impacting your emotional well-being, your relationships, and your day to day functioning. As an experienced therapist, I am here to support you in identifying the tools and resources you already possess as well as introducing new coping skills to manage a variety of  feelings and emotions that are impacting  your ability to cope. I believe that everyone has the ability to heal and grow and I work collaboratively with you in your journey to well-being. 
## 1007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 363-4855
## 1008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, MS Ed, MFT  
## 1010                                                                                                                                                                                                                                                                                                                                         Your everyday choices reflect the meaning you are attempting to bring to your life. Big or small, they are rooted in your in past, hopes, desires, needs, dreams, etc. There are times, however, when you experience trauma, severe life stressors, or times of crisis that impact your ability to make healthy choices producing confusion, fear, anger, and sadness. You may even feel as if it is a struggle to find ease, happiness, and peace. The journey to be more self-aware,  to bring more contentment and joy in your life and to connect with others in healthy ways is the destination that you and I will strive towards.
## 1011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (415) 949-7934
## 1012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist Associate, AMFT, APCC  
## 1014                                                                                                                                                                                                                                                                                                                             Are you feeling stressed? Maybe you're concerned about daily life stressors and have been experiencing racing thoughts often starting with "What if.."? Are you worried about current events and are looking for someone to talk to? Are you experiencing issues with your relationship? Are you interested in having a collaborative discussion on what your identity is or what ways you can adapt to new transitions in your life? If any of these questions apply to you I encourage you to contact me. Let's connect and begin your mental health journey today! Please note: I do not take insurance and I only offer online therapy services.
## 1015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (661) 215-2993
## 1016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1018                                                                                                                                                                                                                                                                                                                                            Life is challenging – we all know that – but the difficulty of these challenges and the way we adapt to them looks different for every single person. Compassion and kindness while working through these challenges is critical to your success in being able to overcome current challenges and build upon your strengths and skills to prepare for the next. My goal as a therapist is to collaborate with you on your goals in a judgement-free environment where you can feel seen and heard, and truly be your authentic self. Together, we create the tools and techniques needed to improve your mental health and wellbeing.
## 1019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (415) 993-5578
## 1020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Counselor, MS, LPCC, ABD  
## 1022                                                                                                                                                                                                                                                                                                                 Stress often highlights issues in our lives. It can also provide an opportunity to address these issues to improve our own functioning. The issues may be in our relationships or circumstances. I would love to partner with you in this journey of discovery and empowerment.  My 25+ years of helping people like you makes me uniquely qualified to collaborate with you on this journey.  I approach issues primarily from a CBT framework but also rely on an eclectic approach that matches the technique with your particular need.  I work remotely to enable flexibility in scheduling.  I also offer a Free 15 min consultation to ensure a good fit.
## 1023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 987-4161
## 1024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Psychologist, PsyD, PMH-C, RYT  
## 1026                                                                                                                                                                                                                                                                                                                                       Difficult life transitions can lead to anxiety and/or depression, making it a time in our lives when we need support, guidance, and a holistic self-care plan. Therapy can provide the opportunity to discover what we really need to be our best selves as we navigate life struggles. I’m a trauma informed, licensed clinical psychologist with 15 years of clinical experience and my collective passion is working with women as they navigate a variety of life challenges and transitions. My approach can help you to explore your patterns, learn more about yourself, and grow in ways that that help you accomplish your goals.
## 1027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (341) 888-6080
## 1028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1030                                                                                                                                                                                                                                                                                                                 There is a good chance that you are already a powerhouse in your own way; either in your career, your academic accomplishments, or your external performance. And yet, there is a struggle hiding behind the mask you have so carefully crafted. Are you.....Working so hard to build success, and watching pieces of your life crumble without knowing why? Feeling like a failure or an imposter? Pacifying your pain through meaningless distraction? Overworking for others? Living in high-conflict relationships that have taken over your life? Struggling to manage your intensity, and believing that you're "too much"? That’s where therapy comes in.
## 1031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (951) 262-7841
## 1032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1034                                                                                                                                                                                                                                                                                                                                                                        I am a Licensed Clinical Social Worker with over 14 years of experiencing partnering with people in need of support, or simply looking to improve their quality of life by making meaningful changes. I enjoy creating a warm, supportive, and accepting therapeutic environment often using humor to put my clients at ease. My goal is to provide the highest level of care to my clients by customizing treatment and drawing from a myriad of Evidence Based Practice models including Cognitive Behavior Therapy, Solution Focused Brief Therapy, Managing Adaptive Practice, and relaxation skills.
## 1035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 345-1801
## 1036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 1038                                                                                                                                                                                                                                                                                                                                                                                            I offer a judgment-free form of counseling in a warm and welcoming environment. I help families, individuals, and couples work through complicated life processes in a nurturing and loving way. I assist your process by offering practical tools to work through even the most difficult situations. I specialize in marriage, individual, child/teen, and couples counseling dealing with infidelity, stress, depression, anxiety, life transition difficulties, anger management, personal development, and healthy communication practices.\nI look forward to hearing from you.
## 1039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 676-7608
## 1040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1042                                                                                                                                                                                                                                                                                                                                                                        I am a Licensed Clinical Social Worker with over 14 years of experiencing partnering with people in need of support, or simply looking to improve their quality of life by making meaningful changes. I enjoy creating a warm, supportive, and accepting therapeutic environment often using humor to put my clients at ease. My goal is to provide the highest level of care to my clients by customizing treatment and drawing from a myriad of Evidence Based Practice models including Cognitive Behavior Therapy, Solution Focused Brief Therapy, Managing Adaptive Practice, and relaxation skills.
## 1043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 345-1801
## 1044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1046                                                                                                                                                                                                                                                                                                                                                                              I believe in holistic healing that encompasses the mind, body, and spirit.  Incorporating all elements can enhance the overall quality of life. Learning to love yourself first, accepting the past, and embracing the pain life can often bring can open up the opportunity to live a full and abundant life.  I also assist with anger management, parenting training, and domestic violence issues for all genders, and sexual identities.  All services rendered are provided with the intention of helping with legal issues, personal desire for change, and maintaining the new healthy you.
## 1047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 340-2260
## 1048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Clinical Social Work/Therapist, LCSW, PPSC  
## 1050                                                                                                                                                                                                                                                                                                                                                                                                                                                       I provide mental health counseling to children, adolescents, and young adults. I support clients struggling with anxiety and depression process their thoughts and feelings so that they can learn safe and healthy coping skills to respond to those challenging experiences. I am motivated by my clients' desire to heal, learn, and grow. Healing is sacred and I provide a safe space for you to share your experiences, process the impact, and release your stress so you can move forward and enjoy being present.
## 1051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 378-4606
## 1052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Psychologist, PsyD, PMH-C, RYT  
## 1054                                                                                                                                                                                                                                                                                                                                       Difficult life transitions can lead to anxiety and/or depression, making it a time in our lives when we need support, guidance, and a holistic self-care plan. Therapy can provide the opportunity to discover what we really need to be our best selves as we navigate life struggles. I’m a trauma informed, licensed clinical psychologist with 15 years of clinical experience and my collective passion is working with women as they navigate a variety of life challenges and transitions. My approach can help you to explore your patterns, learn more about yourself, and grow in ways that that help you accomplish your goals.
## 1055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (341) 888-6080
## 1056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    PhD, MA MFT  
## 1058                                                                                                                                                                                                                                                                                                                                Working with a high performing individual, like yourself, is my speciality. The Go-Getter with goals, determination to accomplish and the fire to achieve. You, as the high performer, may have arrived at a place that in order to remain in the success flow it requires more energy to sustain. Are you experiencing an increase of being reactive in place of proactive? Are you second guessing your capabilities and skills? Let's work together on bringing you in a harmonious state of mind by discovering the innate obstacles that are no longer serving you and begin to cultivate, strengthen and propel you into a growth mindset. 
## 1059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 263-5424
## 1060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 1062                                                                                                                                                                                                                                                                                                                                                      Vulnerability is the foundation of human interactions and relationships. Let me help you become comfortable with your vulnerabilities in a compassionate and non-judgmental therapeutic environment. Finding a sense of love and belonging can help us build relationships when we dare to be imperfect. My ideal client is one who is motivated, open, and willing to commit to the therapeutic process to gain personal insight and reduce current symptoms that are negatively impacting their functioning. Allow me to partner with you and help you understand that you are worthy of connection, love, and belonging.
## 1063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (541) 631-3566
## 1064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist Associate, AMFT  
## 1066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          I am passionate about working with queer people of color who are struggling to believe that they are enough. Many folks come to therapy to improve their self-esteem and are looking for a safe, nonjudgmental space to do that work. It’s common for my clients to come to therapy feeling isolated and find it challenging to connect with others. They’re hoping to understand why they are feeling so uncomfortable and “walled off” from their emotions and the world around them.
## 1067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 495-8348
## 1068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1070                                                                                                                                                                                                                                                                                                                                                                                                                                                            My practice is virtual over the phone or via zoom all you need to do is find a quiet space. My practice style is experiential, goal directed, and CBT oriented. I am available 4 days a week Monday-Thursday from 10am-7pm (hours may be adjusted). With me as your therapist, you can expect to be heard and seen from empathetic and nonjudgmental space. I can help you to develop insight into mental/physical aliments, and give you tools that you can use to move through some of life most difficult moments.
## 1071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 396-5396
## 1072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist Associate, AMFT, APCC  
## 1074                                                                                                                                                                                                                                                                                                                             Are you feeling stressed? Maybe you're concerned about daily life stressors and have been experiencing racing thoughts often starting with "What if.."? Are you worried about current events and are looking for someone to talk to? Are you experiencing issues with your relationship? Are you interested in having a collaborative discussion on what your identity is or what ways you can adapt to new transitions in your life? If any of these questions apply to you I encourage you to contact me. Let's connect and begin your mental health journey today! Please note: I do not take insurance and I only offer online therapy services.
## 1075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (661) 215-2993
## 1076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Pre-Licensed Professional, MS, MDiv, Coach  
## 1078                                                                                                                                                                                                                                                                                                                    Are you someone that has difficulties making decisions?  Are you always second-guessing yourself? Do you SOMETIMES wonder if you can make it from one moment to the next? Have you ever felt like your creativity has disappeared? Has your ZEST for life waned or your motivation for new and fun experiences become non-existent? Has past pain, hurt and trauma kept you from achieving your goals or fulfilling your dreams? Do you find yourself doing what others expect of you, and not fulfilling what makes your heart passionately beat? Do you question God's purpose for your life, or the reason why you exist? HAVE YOU LOST YOUR ESSENTIALITY?
## 1079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (909) 324-2854
## 1080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1082                                                                                                                                                                                                                                                                                                                                                                                                 Ever question why you may repeat the same patterns or behaviors? Do you have troubling memories, or road blocks, that prevent you from achieving harmony in relationships? My goal is to collaborate with you to deepen your focus and understanding of yourself. We can create any life we want when we know how to do that. I use thought and behavioral changing techniques alongside various trauma-informed skills-building approaches including mindfulness and cognitive-behavioral therapy (CBT) to increase confidence in your own ability to find your best solutions.
## 1083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 605-2177
## 1084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       MA, MAPS  
## 1086                                                                                                                                                                                                                                                                                                                                                                                                        Greetings everyone.  Teletherapy offers the exceptional opportunity for a therapist or life coach and client to facilitate an environment that encourages understanding, clarity, and growth.  In this environment the client and therapist identity areas for work, as well as create a path that leads to understanding and empowerment. What is teletherapy? Teletherapy involves the use of real-time interactive video conferencing between a therapist and client(s) to communicate and provide care remotely with the requirement of being in the same location.  
## 1087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (832) 532-9060
## 1088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1090                                                                                                                                                                                                                                                                                                                 There is a good chance that you are already a powerhouse in your own way; either in your career, your academic accomplishments, or your external performance. And yet, there is a struggle hiding behind the mask you have so carefully crafted. Are you.....Working so hard to build success, and watching pieces of your life crumble without knowing why? Feeling like a failure or an imposter? Pacifying your pain through meaningless distraction? Overworking for others? Living in high-conflict relationships that have taken over your life? Struggling to manage your intensity, and believing that you're "too much"? That’s where therapy comes in.
## 1091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (951) 262-7841
## 1092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1094                                                                                                                                                                                                                                                                                                                                                            Do you lie awake at night, wondering why you just can’t find solutions to your problems? Do you seek a change in your life? Are you anxious about something - or about nothing? And can it ever be different? What if I told you that you have untapped potential and strengths already inside you to engage with and overcome your problems? Well, in fact you do. As a compassionate, caring and experienced psychotherapist with over twenty years in the helping profession, it is my goal to engage with you to recognize and utilize those untapped strengths in order to help you make the changes you desire.
## 1095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (661) 387-3894
## 1096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Marriage & Family Therapist, MA, MS, LMFT  
## 1098                                                                                                                                                                                                                                                                                                                 Thank you for allowing me the opportunity to join you on your journey towards healing. I am a New York City native currently licensed in California and licensed to provided telehealth therapy in the state for the state of Florida. I am a Board of Behavioral Sciences Approved Clinical Supervisor, an American Association of Marriage and Family Therapist approved Clinical Supervisor and Clinical Fellow. I have over 14 years of clinical experience as an outpatient therapist with Department of Mental Health contracted agencies, nonprofit organizations and owner of private practice, The Healing Chariot (No Insurance/No Sliding Scale Fee).
## 1099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 404-6536
## 1100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 1102                                                                                                                                                                                                                                                                                                                                                                                            I offer a judgment-free form of counseling in a warm and welcoming environment. I help families, individuals, and couples work through complicated life processes in a nurturing and loving way. I assist your process by offering practical tools to work through even the most difficult situations. I specialize in marriage, individual, child/teen, and couples counseling dealing with infidelity, stress, depression, anxiety, life transition difficulties, anger management, personal development, and healthy communication practices.\nI look forward to hearing from you.
## 1103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 676-7608
## 1104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, LMFT, PsyD  
## 1106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Brandy Reid is an experienced licensed therapist offering 14 years of experience with a demonstrated history of working in community mental health and private practice. I work with clients (children and adults) who have life experiences resulting from trauma, depression, anxiety, conduct disorder, substance use, divorce, abuse, or homelessness. 
## 1107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (747) 229-0609
## 1108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist, MA, LMFT, CCHt  
## 1110                                                                                                                                                                                                                                                                                                                               Life isn’t always easy!  Even the strongest amongst us need a little help to work through life’s challenges. Surviving but not thriving in your relationships? People assume you have it all together, and may not understand you’re struggling, leaving you to feel lonely at times. Do you get tired of overthinking or feel paralyzed by fear, anxiety or the need to get it just right? Are you feeling overwhelmed, and stressed by the pressures of life? Does your self-esteem dip when you can’t meet all of life's demands? Tired of second guessing or compromising who you are? Past traumas or PTSD interfering with your inner peace?
## 1111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 388-9528
## 1112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist Associate, AMFT, MFT  
## 1114                                                                                                                                                                                                                                                                                                                                                                                                                Both nurturing yet direct, teaches my clients practical tools that lead to their empowerment, growth, and healing. By creating a safe, open, and secure space, clients can sort out their vulnerabilities and move toward their desired outcomes, goals, and desires. Ranique is passionate about providing mental health services that are tailored to individuals’ preferences and personal needs. Ranique believes that emotional well-being is just as important as the air we all breathe. We specialize in providing affordable  telehealth/online therapy.
## 1115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 488-6057
## 1116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 1118                                                                                                                                                                                                                                                                                                                                                          Are you a person trying to explore your gender, race, or sexuality? Do you struggle to communicate your needs, set boundaries, and be assertive? I challenge you to speak your truth, understand yourself, and be authentic while maintaining boundaries. I use humor and a strong therapeutic relationship to help you be your ideal, most grounded self. When I think about transforming and changing one's life, I always reflect on Audre Lorde's powerful words. "What are the words you do not yet have...Next time, ask: What's the worst that will happen? Then push yourself a little further than you dare. "
## 1119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 1120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 1122                                                                                                                                                                                                                                                                                                                                                                                            I offer a judgment-free form of counseling in a warm and welcoming environment. I help families, individuals, and couples work through complicated life processes in a nurturing and loving way. I assist your process by offering practical tools to work through even the most difficult situations. I specialize in marriage, individual, child/teen, and couples counseling dealing with infidelity, stress, depression, anxiety, life transition difficulties, anger management, personal development, and healthy communication practices.\nI look forward to hearing from you.
## 1123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 676-7608
## 1124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, LMFT, PsyD  
## 1126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Brandy Reid is an experienced licensed therapist offering 14 years of experience with a demonstrated history of working in community mental health and private practice. I work with clients (children and adults) who have life experiences resulting from trauma, depression, anxiety, conduct disorder, substance use, divorce, abuse, or homelessness. 
## 1127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (747) 229-0609
## 1128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Clinical Social Work/Therapist, LCSW, PPSC  
## 1130                                                                                                                                                                                                                                                                                                                                                                                                                                                       I provide mental health counseling to children, adolescents, and young adults. I support clients struggling with anxiety and depression process their thoughts and feelings so that they can learn safe and healthy coping skills to respond to those challenging experiences. I am motivated by my clients' desire to heal, learn, and grow. Healing is sacred and I provide a safe space for you to share your experiences, process the impact, and release your stress so you can move forward and enjoy being present.
## 1131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 378-4606
## 1132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Welcome to the first step in interrupting your spiral of depression, anxiety, and self doubt. I have been providing therapy since 2007 that is solution focused, person centered and holistic. The populations I have expertise working with are Veterans, LGBTQ and Women of Color experiencing Pet to Threat in a corporate career environment. Specialized training in treating ADHD, Housing Insecurity, Depression, Anxiety and PTSD.
## 1135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (510) 925-1708
## 1136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Psychologist, PsyD, PMH-C, RYT  
## 1138                                                                                                                                                                                                                                                                                                                                       Difficult life transitions can lead to anxiety and/or depression, making it a time in our lives when we need support, guidance, and a holistic self-care plan. Therapy can provide the opportunity to discover what we really need to be our best selves as we navigate life struggles. I’m a trauma informed, licensed clinical psychologist with 15 years of clinical experience and my collective passion is working with women as they navigate a variety of life challenges and transitions. My approach can help you to explore your patterns, learn more about yourself, and grow in ways that that help you accomplish your goals.
## 1139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (341) 888-6080
## 1140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1142                                                                                                                                                                                                                                                                                                                  In therapy, I facilitate a welcoming, explorative environment through the implementation of solution focused therapy, cognitive behavioral therapy, and existentialism. For that reason, my ideal client either comes knowing what that would like to get out of therapy or is willing to work together to determine possible areas in which they would like to see improvement. Some goals set by my clients have included being happier, feeling less anxious, improving their focus on a specific habit, building their awareness on their future, improving their relationships with their significant other, and increasing their connections with others.
## 1143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (408) 763-4575
## 1144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Pre-Licensed Professional, MS, MDiv, Coach  
## 1146                                                                                                                                                                                                                                                                                                                    Are you someone that has difficulties making decisions?  Are you always second-guessing yourself? Do you SOMETIMES wonder if you can make it from one moment to the next? Have you ever felt like your creativity has disappeared? Has your ZEST for life waned or your motivation for new and fun experiences become non-existent? Has past pain, hurt and trauma kept you from achieving your goals or fulfilling your dreams? Do you find yourself doing what others expect of you, and not fulfilling what makes your heart passionately beat? Do you question God's purpose for your life, or the reason why you exist? HAVE YOU LOST YOUR ESSENTIALITY?
## 1147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (909) 324-2854
## 1148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist Associate, AMFT  
## 1150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          I am passionate about working with queer people of color who are struggling to believe that they are enough. Many folks come to therapy to improve their self-esteem and are looking for a safe, nonjudgmental space to do that work. It’s common for my clients to come to therapy feeling isolated and find it challenging to connect with others. They’re hoping to understand why they are feeling so uncomfortable and “walled off” from their emotions and the world around them.
## 1151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 495-8348
## 1152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1154                                                                                                                                                                                                                                                                                                                             You want to be present, find ease, and fully enjoy your life and relationship but anxiety, trauma, and big transitions keep getting in the way. You've worked hard to create this life and your relationships. You do your best to "have it all together" for friends, family, colleagues, your partner. In the middle of all the roles, changes, and expectations you've lost yourself, disconnected from your needs, and lost track of your values and joy. Whether it is constant anxiety, conflict and disconnection in your relationships, or pain that keeps holding you back - you're just done living this way and ready to live more fully.
## 1155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (209) 553-4636
## 1156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1158                                                                                                                                                                                                                                                                                                                 There is a good chance that you are already a powerhouse in your own way; either in your career, your academic accomplishments, or your external performance. And yet, there is a struggle hiding behind the mask you have so carefully crafted. Are you.....Working so hard to build success, and watching pieces of your life crumble without knowing why? Feeling like a failure or an imposter? Pacifying your pain through meaningless distraction? Overworking for others? Living in high-conflict relationships that have taken over your life? Struggling to manage your intensity, and believing that you're "too much"? That’s where therapy comes in.
## 1159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (951) 262-7841
## 1160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    PhD, MA MFT  
## 1162                                                                                                                                                                                                                                                                                                                                Working with a high performing individual, like yourself, is my speciality. The Go-Getter with goals, determination to accomplish and the fire to achieve. You, as the high performer, may have arrived at a place that in order to remain in the success flow it requires more energy to sustain. Are you experiencing an increase of being reactive in place of proactive? Are you second guessing your capabilities and skills? Let's work together on bringing you in a harmonious state of mind by discovering the innate obstacles that are no longer serving you and begin to cultivate, strengthen and propel you into a growth mindset. 
## 1163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 263-5424
## 1164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1166                                                                                                                                                                                                                                                                                                                                                                                                                                                            My practice is virtual over the phone or via zoom all you need to do is find a quiet space. My practice style is experiential, goal directed, and CBT oriented. I am available 4 days a week Monday-Thursday from 10am-7pm (hours may be adjusted). With me as your therapist, you can expect to be heard and seen from empathetic and nonjudgmental space. I can help you to develop insight into mental/physical aliments, and give you tools that you can use to move through some of life most difficult moments.
## 1167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 396-5396
## 1168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist Associate  
## 1170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      I provide uniquely tailored psychotherapy services to individuals, couples, and families who are experiencing difficulty adapting to our ever-evolving world. I understand that we encounter obstacles in life that unfortunately prevent us from operating at our greatest potential and divine self. I use integrative theoretical orientations, and my life’s experiences to accompany my clients on their healing and wellness journey.
## 1171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 960-7503
## 1172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA,LMFT  
## 1174                                                                                                                                                                                                                                                                                                                                     I sought therapy to heal and break free of the trans-generational cycle of trauma. My passion is working with trauma survivors to help them heal and break the trans-generational cycles in their lives. I enjoy working with Bipoc, queer, and neuro-divergent individuals. My specialities are racial trauma, identity (sexual, personal, and cultural), sex therapy, relationships, and life transitions. I want to help you communicate more effectively, become more vulnerable, gain a better understanding of who you are, increase your self compassion, let go of fear, decrease your anxiety, and embrace your strength and power.
## 1175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 340-6371
## 1176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 1178                                                                                                                                                                                                                                                                                                                 Life happens! No matter who we are, what we've accomplished in our lives, what socioeconomic class we belong to, how educated we are, life happens! Life is filled with many unexpected, life-altering experiences such as: divorce, retirement, grief/bereavement, loss, family and blended family issues, couples issues, relational issues, anxiety, depression, trauma, and more. My heart's desire is to assist my clients through those difficult and challenging times in life so they can "bounce back" and get to living the lives they desire. There is a resolution and I'd be honored to help you find it. Let's do the work - accomplish the GOALS!
## 1179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 393-2789
## 1180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1182                                                                                                                                                                                                                                                                                                                                                                                                                                                                      What has happened to you? Have you experienced hardship, life changes, or something traumatic?  I am a Licensed Marriage and Family Therapist in the State of California and Texas. I have over 10 years of practice experience. I received my master’s in Counseling Psychology from Argosy University with a focus on Marriage and Family Therapy. I have worked in various settings including county mental health office, community mental health clinics, schools/universities, and hospital settings.
## 1183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (510) 240-8510
## 1184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Clinical Social Work/Therapist, LCSW, Coach  
## 1186                                                                                                                                                                                                                                                                                                                                                                                          Our inner critic can get loud. She tends to be impatient, judgmental, and downright mean. And if she has the mic most of the time, she tends to steal the show and hold us back. So we find ourselves feeling stuck, playing small, never taking center stage and hiding in the background of our own lives. Cue the low self-esteem, impostor syndrome, self-doubt, and limiting beliefs. We don't speak up, we don't take that leap, we don't try out for that part, and we don't feel connected or aligned to our full, infinite potential. But what if you could take back the mic?
## 1187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 1188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1190                                                                                                                                                                                                                                                                                                                                                                                     You never thought it would be this hard. Trying to conceive. Being pregnant. Being a new mother. Your thoughts are racing and your inner voice is constantly criticizing yourself. You just can’t seem to quiet your mind down. You worry. All. The. Time. You spend all your time nurturing others but can’t really remember the last time you had time just to nurture yourself. You may be feeling lost, even afraid, that this is your new reality and you’ve lost the “old you”. You are worthy of support and starting a journey where you can heal, thrive, and be authentically you.
## 1191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 975-3704
## 1192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist, MA, LMFT, CCTP  
## 1194                                                                                                                                                                                                                                                                                                                                                           Tracie received her clinical training at the prestigious Maple Counseling Center in Beverly Hills, California, allowing her to become adept at working with a very diverse and challenging population. Her current clientele is comprised of adults and adolescents, high school and college students, entertainment industry professionals, former executives, professors, athletes, stay at-home moms (and dads) and seniors. She utilizes individual, couples and family therapy, as well as modalities including dialectical behavior therapy (DBT), cognitive behavioral therapy (CBT) and psychodynamic therapy.
## 1195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 905-8287
## 1196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Psychologist, MS, PsyD  
## 1198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                The ideal client is one who is ready to work for desired outcomes. My therapy style is change-focused and practical. Based on an ACT model, I prefer to set goals that speak to a client's personal values. My treatment focus is on taking action to achieve the valued lifestyle. If you want to live life to the fullest despite your mental health concerns, you and I will be a great match!
## 1199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 693-1471
## 1200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA,LMFT  
## 1202                                                                                                                                                                                                                                                                                                                                     I sought therapy to heal and break free of the trans-generational cycle of trauma. My passion is working with trauma survivors to help them heal and break the trans-generational cycles in their lives. I enjoy working with Bipoc, queer, and neuro-divergent individuals. My specialities are racial trauma, identity (sexual, personal, and cultural), sex therapy, relationships, and life transitions. I want to help you communicate more effectively, become more vulnerable, gain a better understanding of who you are, increase your self compassion, let go of fear, decrease your anxiety, and embrace your strength and power.
## 1203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 340-6371
## 1204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Counselor, LPCC, CADCII  
## 1206                                                                                                                                                                                                                                                                                                                   Online Only-The best time to begin or restart your life's journey is NOW!. I provide comprehensive psychotherapy services.  I utilize a culturally competent approach to assessment, and believe that psychotherapy  requires the ability to understand culture, socioeconomic factors and ethnicity.  My approach begins with establishing a therapist-client relationship by creating a safe, nurturing nonjudgmental environment to address your concerns and challenges. In addition, I understand addiction and the challenges that people face who struggle with substance use.  I can assist you with determining if your substance use is problematic.
## 1207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (209) 500-4284
## 1208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 1210                                                                                                                                                                                                                                                                                                                 Though you move forward daily, you struggle with confidence and experience feelings of fear, anxiety & loneliness. You may feel overwhelmed, unloved, and unseen. While you may not understand how you got off track, you lack a sense of purpose: not finding true happiness in your daily living, difficulty feeling & expressing gratitude, and never truly living in the moment. Past hurt has caused you to build up protective barriers & while they help in some aspects, they also create an inability to connect. You’ve worked hard & accomplished so much, yet you struggle with persistent feelings of self-doubt. You may wonder: Where did "I" go.
## 1211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 417-6673
## 1212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1214                                                                                                                                                                                                                                                                                                                          No worries, I Got U!  I'm a Licensed Clinical Social Worker, aka psychotherapist, with more than 15 years of working in Behavioral Health. I provide therapeutic interventions that address depression, anxiety, relationship issues, career challenges, and Substance Use disorder, to name a few. I am also a Certified Complex Trauma Professional (CCTP-II) and a Certified Dialectical Behavioral Therapist.   My clinical practice embraces a strengths-based approach to overcoming your challenges, and my therapy style is pretty laid back. I have been described as supportive and an active listener, with a pretty good sense of humor.   
## 1215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (909) 325-7949
## 1216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1218                                                                                                                                                                                                                                                                                                                   Starting the process of exploring challenging memories, finding ways to let light in through the cracks, and get up and meet your challenges can be a difficult task to tackle on your own. I strive to be the person to advocate, provide a safe environment, and collaborate with you during unexpected, unrehearsed times of hardship, heart ache, loss, or just confusing times. I am also an ally to the LGBTQ+ community and dedicated to providing a safe space and affirmative support. My primary goal is to establish therapeutic alliance that fosters hope, healing, personal growth, and insight to continue to get up and show up in the world. 
## 1219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 375-5910
## 1220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Are you tired of feeling stuck in the same cycle of unhealthy patterns? Paper Cranes Counseling can help. We are a private group practice in California specializing in identity, interpersonal relationships, and the inner child. We are focused on connecting underrepresented wellness seekers with culturally-affirming, holistic, care.
## 1223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 388-3478
## 1224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1226                                                                                                                                                                                                                                                                                                                                 It’s early in the morning, and your eyes pop open to the sound of a blaring alarm clock. Groaning, you hit the snooze button as you start dreading the grueling day ahead. Lying in bed, you scroll through your phone, looking for the motivation to get you through this day. Instead, you're met with images of women with perfect bodies and perfect lives. You can’t help but compare yourself to them. A voice says, “that’ll never be you; it can't be.” You try to dismiss it, but the voice in your head gets louder. You can’t shake the feeling that you don’t deserve happiness or success in your life. You feel lost and defeated.
## 1227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (510) 949-3702
## 1228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, ACSW  
## 1230                                                                                                                                                                                                                                                                                                                 Life is complex and it can lead you to feel unbalanced, or disconnected from yourself and others. Do you find yourself questioning your self-worth or having difficulty creating healthy boundaries? Maybe you’re experiencing anxiety or depression, or processing difficult life events and changes. I understand that life can present its share of challenges due to the systems, communities, and families we live in and come from. I'm passionate about creating supportive and liberating spaces for individuals and I strive to create a space of understanding and safety for people of color, and women during pregnancy and their mothering journey.
## 1231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 489-3317
## 1232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 1234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Sometimes we experience things that get in the way of living our best life, and sometimes our choices, behaviors, and ideas are the things holding us back. Whether you're experiencing a life-changing event, struggling to set boundaries, or working to break those toxic generational patterns that you've been taught, therapy can be the tool that facilitates growth, self-reflection, and real self-awareness.
## 1235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 602-1256
## 1236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Starting therapy can be scary! Therapy is a collaborative process that allows me to guide and empower you to resolve issues that are affecting your life. I work with adults who are struggling with anxiety, depression, relationship issues, and boundary-setting in work and personal life. I provide culturally appropriate services while using your strengths as a starting point. I am queer and trans-affirming and welcome LGBTQAI clients, their families and loved ones.
## 1239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 655-8570
## 1240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1242                                                                                                                                                                                                                                                                                                                                                  We all get stuck, but we don't have to stay that way. Therapy is a place for new beginnings. Beginning to learn about ourselves. Beginning to increase self-love and appreciation. Beginning to heal. I believe all individuals are unique, thus therapy is not a one size fits all. I aim to meet each client where they are, with understanding and a strong therapeutic relationship as the foundation for a transformative process. Most of us are doing the best we can with what we've received from our loved ones and early experiences, my goal is to have you leave with more, and for your best to only get better. 
## 1243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 499-2938
## 1244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, MA, LMFT, LPCC, MPA  
## 1246                                                                                                                                                                                                                                                                                                                 Morant Clinical Services works exclusively with busy professional adults, couples and adult families who need confidential evening and weekend Telehealth sessions. We see you weekly for optimal results, then done. We know you are busy and understand that your time is a commodity.  Is it true that you keep creating the same unhealthy situations in your life over, and over again? Do you want to stop attracting those who don't add value to your life? Are you a creative person who needs a push to reach your success? Is that imposter bothering you? Are you planning to marry and want to be sure this is the right step forward? Let us help!
## 1247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 348-6970
## 1248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Pre-Licensed Professional, MSW, ACSW, CLE, PMH-C  
## 1250                                                                                                                                                                                                                                                                                                                                                                                                                                                                        I am passionate about helping you navigate to a better well-being. It’s my goal to empower you to get your needs met in a way that speaks to you as an individual and for you to look back at your struggles and embrace them as victories. What you’re going through matters. You have value, and you are deserving of kindness without judgment. As someone who has dealt with anxiety as well as postpartum depression, I can tell you that there is a road that leads to less suffering and more joy.
## 1251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 314-7713
## 1252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 1254                                                                                                                                                                                                                                                                                                                 In our work together, my intention is to help you break away from the maladaptive thought patterns, emotions, actions, and external circumstances that keep you stuck in an unwanted experience. My goal is to help you create progress towards the life you do want for yourself. I’ll want to understand the changes you’d like to see in yourself. With this in mind, I’ll want to identify the behaviors you’d like to demonstrate, the lasting emotions you’d like to feel, and the outcomes you’d like to see present themselves in your life. With that information, we'll set the overall goals for therapy. Now providing Psychedelic Assisted Therapy.
## 1255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (628) 201-6946
## 1256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1258                                                                                                                                                                                                                                                                                                                                                                                                                                                                          I am Telehealth ONLY. Are you in search of therapy for general psychological hygiene maintenance? Are you feeling like you need support in breaking unhealthy thought or behavior patterns? Are you feeling disconnected from yourself? Having a hard time coping with challenges from the past or the present? Not feeling worthy? Are you in search for someone to help you get out of the darkness, and lift the weight you're experiencing from loss, new transitions, your past, or relationships?
## 1259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 704-9525
## 1260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          I am a licensed therapist that understands the courage it takes to make the first step towards change. I believe creating a positive therapeutic relationship and a safe environment is essential for change to take place. I take pride in supporting individuals on their journey toward wellness through a non-judgmental, compassionate and collaborative approach.
## 1263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 322-6641
## 1264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1266                                                                                                                                                                                                                                                                                                                                                                                        Do you have a painful history, stressful life event or tumultuous past that is keeping you from having satisfying relationships and healthy intimacy with others? Whether dealing with depression, anxiety, or simply current challenging situations, there are healthy and effective ways to cope and heal. If you would like to learn more ways to manage these hardships, therapy may be right for you. Whether individual, couples, or family counseling, finding a compassionate and objective provider can be nurturing in helping to make the shift that you need to move forward.
## 1267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 489-6397
## 1268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Counselor, LPCC  
## 1270                                                                                                                                                                                                                                                                                                                                                                  Welcome! Sometimes reaching out for help is the most courageous move you can make. So, I’m glad you’ve made it this far. There are various issues and barriers that make it difficult to understand where you want to go, or how to get there. Issues from childhood experiences, life transitions, trauma, poor relationships with self and others, mental and physical health, and feeling shame can impact your life on every level. Maybe you feel stuck? Or disconnected? Perhaps you find yourself anxious, depressed or maybe even struggling to like yourself? You’re not alone and your story matters.
## 1271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 351-1038
## 1272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1274                                                                                                                                                                                                                                                                                                                                                                                               Welcome! I’m glad that you are here. You’ve taken the first steps towards the relief and clarity you deserve. Connecting with the right therapist is essential to the healing process and I hope to help in making your journey a lot lighter. I’m open and available to answer any questions you may have about the therapy process if this is your first time seeking help. I work with adults struggling to manage the grief of life that may show up in the form of anxiety, chronic stress, self doubt, guilt and depression. I’m here to help you find or regain your power!
## 1275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 407-3688
## 1276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Counselor, LMHC, LCSW, MHC-LP, Interns  
## 1278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Expansive Therapy is a bicoastal psychotherapy practice with locations in Los Angeles and New York City. We have a diverse team of therapists offering a wide variety of modalities and specialties, and we match you with a provider who meets your needs and availability. Our mission at Expansive Therapy is to create a safe space to heal and grow, to expand the things that are working, and to encourage personal freedom.
## 1279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (415) 655-0458
## 1280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1282                                                                                                                                                                                                                                                                                                                                                                                                                                                            The majority of my clientele are insightful, high-achieving professionals who have excelled in their careers but have come to a place in their lives where they now feel stuck. They know that the skills they have used to get them where they are in life, are not enough to get them to where they want to be. Maybe they are excellent in their professional lives but want to improve their relationships with their loved ones. Perhaps they work great alone but have difficulty sharing the load with others.
## 1283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 504-7617
## 1284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, LCSW, MPH  
## 1286                                                                                                                                                                                                                                                                                                                     The mask we wear covers how lonely we really feel. Are you going through the motions, when all you feel is lost, depressed, scared, and drained? Are you having trouble speaking up for yourself in relationships or struggling with boundaries at home or at work? Do you hold it all in, constantly frustrated? Is it hard to make life transitions right now? Are you crying in the car on the way to work while still telling everyone you are fine? Being the “strong one” is so tiring. It silences us. Let’s find your voice. You deserve a place to cry, vent, find your footing, and emerge your best self. I would be honored to help you do that.
## 1287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 317-8916
## 1288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Are you struggling to keep up with your relationships, work and health? Are you having difficulty coping with life's many stressors.  I help empower clients to build positive coping skills and help manage their life stressors. Together, we can identify what's not working and get you back to balance.  I have experience working with individuals dealing with depression, anxiety, chronic pain/illness, work stress, life transitions and general mental health concerns.
## 1291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (858) 330-5810
## 1292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1294                                                                                                                                                                                                                                                                                                                                   Hi there, I'm Crystal, a Licensed Clinical social worker with over 8 years of experience in the field. I am proudly born and raised in Inglewood, California. My experience includes field-based mental health, outpatient, hospice, psychiatric inpatient hospital setting, group homes, and currently private practice. I have helped people with anxiety, depression, stress, relationship issues, personality disorders, and more. My diverse, universal approach creates a safe and supportive environment while challenging my clients.  I use Acceptance and Commitment (ACT), CBT, DBT, Person-Centered, and Psychodynamic modalities.
## 1295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 730-7954
## 1296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                My practice is grounded in the belief that greater insight into our emotions, thoughts, and motivations can bring us closer to our highest selves.  I provide a judgment-free space where clients can build self-compassion and feel that their voices are heard.
## 1299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (747) 269-1400
## 1300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, LMFT, APCC  
## 1302                                                                                                                                                                                                                                                                                                                                                                                                                                                      I am dedicated to meeting you where you are and assisting you with identifying and reaching your ultimate goals in life. Together we will work on establishing effective coping skills, which will help you with improving your daily living. I believe that the purpose of therapy is to provide you with a safe space, which is culturally sensitive to your individualized needs and situations. Though the past cannot be changed, your past is a part of your priceless journey of healing, growth, and perseverance. 
## 1303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 745-2671
## 1304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1306                                                                                                                                                                                                                                                                                                                         Life is a journey of many ups and downs with many bumps in the road along the way. I specialize in helping people with those bumps. When I began working in this field I treated adults whom have problems with substance abuse. As I worked with this population I realized that many of my clients were dealing with a plethora of other mental health issues. I continued to refine my skills in therapy I then spent a few years working primarily with children (as young as toddlers through adolescence)also with their parents and families as well. This taught me that many problems people have as adults can begin when they are very young.
## 1307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 659-2812
## 1308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1310                                                                                                                                                                                                                                                                                                                                                                                                                                                     The success of my clients is their commitment to therapy.  This is the client’s biggest accomplishment, beginning something that they likely thought was impossible.  Similarly, when clients can set clear, specific goals they become attainable.  Self-acceptance is also success for my clients.  Once my clients have developed self-acceptance, then they can understand their feelings and emotions. I support my clients by helping them reduce the intensity of their symptoms by developing healthy coping skills.
## 1311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 431-2723
## 1312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1314                                                                                                                                                                                                                                                                                                                                                                                       Life throws us so many different obstacles and challenges that sometimes it can be very overwhelming. You may struggle with relationships, trusting others, understanding yourself, suicide, fear of the future, feeling unappreciated or loved, and a lot more.  The challenges we face, are common but may have us feeling and thinking the worse. This can cause us to feel alone and can cause us to isolate. Many don’t know how to cope and or feel confused.  Many are lost with a lot of thoughts and feelings, not realizing that these feelings and thoughts are normal to have.
## 1315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 873-4298
## 1316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 1318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Let go of anxiety, work related stress, and unhealthy coping behaviors. Learn new skills for healthy peer cultivation, trustworthiness, and release anxiety related to traumatic events. This is the best time to cultivate sound skills for better life decisions including "moving on", forgiveness, and healing from trauma related events!  
## 1319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (747) 220-0439
## 1320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 1322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       How would you rate the quality of your relationships at this moment?  Do you enjoy your own company? How is your connection with your family?  Do you have a sense of community?  Let's explore the various manifestations of loneliness and intimacy.  Your overall well-being is determined by the status of your intrapersonal and interpersonal relationships.  I want to work with you to create the life you desire - let's work toward it together.
## 1323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 1324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1326                                                                                                                                                                                                                                                                                                                                           What's standing in the way of you having a healthy relationship? Relationships are challenging. Finding one and maintaining a healthy one can feel even tougher. Whether we didn’t learn the skills to do so or our past hurts are getting in the way, we often find ourselves stuck or unsure how to form lasting and meaningful relationships.  Let’s work together to uncover unconscious beliefs holding you back and heal past traumas impacting your ability to love yourself and be content in your relationships. Together we can discover effective ways to express your inner most feelings, unmet needs, and rekindle love.
## 1327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 361-1498
## 1328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1330                                                                                                                                                                                                                                                                                                                      Hello and welcome to my practice! My name is Dana and I am a Licensed Clinical Social Worker and a graduate of the University of Southern California School of Social Work. I have worked in this amazing field for 20 years serving individuals much like yourself who are looking for insights, skills, tools, and support to optimize their lives. I have worked with adults, adolescents, and children across various settings, including private practice, outpatient primary care clinics, and inpatient facilities. I aim to bring safety, curiosity, flexibility, and openness, to help facilitate collaboration and understanding with my clients.
## 1331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 660-7513
## 1332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1334                                                                                                                                                                                                                                                                                                                                                                                               Welcome! I’m glad that you are here. You’ve taken the first steps towards the relief and clarity you deserve. Connecting with the right therapist is essential to the healing process and I hope to help in making your journey a lot lighter. I’m open and available to answer any questions you may have about the therapy process if this is your first time seeking help. I work with adults struggling to manage the grief of life that may show up in the form of anxiety, chronic stress, self doubt, guilt and depression. I’m here to help you find or regain your power!
## 1335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 407-3688
## 1336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1338                                                                                                                                                                                                                                                                                                                                                                                                                                                                          I am Telehealth ONLY. Are you in search of therapy for general psychological hygiene maintenance? Are you feeling like you need support in breaking unhealthy thought or behavior patterns? Are you feeling disconnected from yourself? Having a hard time coping with challenges from the past or the present? Not feeling worthy? Are you in search for someone to help you get out of the darkness, and lift the weight you're experiencing from loss, new transitions, your past, or relationships?
## 1339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 704-9525
## 1340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1342                                                                                                                                                                                                                                                                                                                                My approach to therapy is client-centered and humanistic with integrated, evidence-based interventions, such as cognitive behavioral therapy. I tend to pull from a variety of modalities so that I can tailor your therapeutic journey to better fit your individual needs and goals. Working with me is very casual yet structured; I will challenge you to explore conscious and unconscious aspects of your life to assist you in meeting your full potential so that you can live a prosperous and joyous life. If you are interested in working with me, I would suggest a consultation first to see if we are a good match for each other.
## 1343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 361-2611
## 1344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 1346                                                                                                                                                                                                                                                                                                                                                                                  Thank you for reviewing my profile. Looking for a therapist can be mutually daunting and exciting. It takes a tremendous amount of courage and vulnerability to decide to get support in any area of your life, and I am available to empower and guide you on your therapeutic journey. I offer a Relational Gestalt approach to therapy, which means that we build an alliance together focusing on embodiment and what is present for you in the moment. I bear witness and support you in increasing your awareness of your experience as we share space for your transformational healing.
## 1347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 387-3578
## 1348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1350                                                                                                                                                                                                                                                                                                                                                                                                                             Offering feedback, another perspective, and/or coping skills can be very helpful. On the other hand, sometimes people just need a listening ear. Over the past 11 years, I have been fortunate enough to develop a strong skill set to not only meet clients where they are in their healing process, but also be that listening ear, voice of reason and give clinical insight when needed. Sometimes life gets tough. Sometimes we as people experience events that just seem impossible to overcome. Sometimes we just don’t feel like ourselves.
## 1351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 736-1983
## 1352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1354                                                                                                                                                                                                                                                                                                                                                     Thank you for giving me a chance to assist you along your journey to wellness. My goal is to collaborate with you, leveraging your strengths and human potential, to help you overcome challenges in your life. In life we can all be more effective and live happy and fulfilling lives. The mission of my practice is to get you there, however you define it. Life's challenges like depression, anxiety, sexual identity, career issues, relationships, or transitions no longer need to get in your way of happiness. Resilience, problem solving, and creating more satisfying visions of the future are my specialty.
## 1355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 704-9915
## 1356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 1358                                                                                                                                                                                                                                                                                                                                                                                     As a therapist, I pride myself on being aware of people's unique qualities and characteristics. I am empathetic, structured, honest, and will challenge you so that your progress is observable and empowering. Life gets complicated sometimes, and it feels like there are issues you cannot resolve on your own. That's where I come in. As your therapist I want your experience to be insightful, healing and supportive, so that you can grow and resolve these issues independently. I have experience working with all age groups, however, my primary focus is therapy with adults.
## 1359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 403-0236
## 1360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Marriage & Family Therapist Associate, ASW  
## 1362                                                                                                                                                                                                                                                                                                                                                                                                                                        When we understand the relationship between our thoughts, feelings, and behaviors, we can create long-lasting change. Therapy is an opportunity to learn about ourselves, begin the healing process, and most importantly, get some relief. I have spent many years working in treatment programs, focusing on mental health and addiction. While substance abuse therapy is centered on building coping skills and learning relapse prevention strategies, I work with clients to understand the relationship they had with substances. 
## 1363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 362-5712
## 1364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                My practice is grounded in the belief that greater insight into our emotions, thoughts, and motivations can bring us closer to our highest selves.  I provide a judgment-free space where clients can build self-compassion and feel that their voices are heard.
## 1367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (747) 269-1400
## 1368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1370                                                                                                                                                                                                                                                                                                                                                                                             As a licensed therapist and the founder of Makepeace Therapy, I have been working with individuals and couples in California for over 9 years. Throughout my life and in my practice, I have continuously experienced that people can heal from the suffering past trauma has created in their lives. I am so passionate about therapy because it allows for an incredible unfolding process to discover the root of our pain, change unwanted patterns and behaviors, and allow for the creation of the necessary changes that lead to living fulfilled, healthy, and joyful lives!
## 1371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 495-8553
## 1372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 I believe it takes a strong person to seek out counseling and support to initiate the change you are looking for. I would love to help you get there. As a Licensed Marriage and Family Therapist, I am committed to working with you to create change by developing goals, identifying and increasing strengths, processing experiences, empowering, nurturing, and providing psychoeducation to enable change.
## 1375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 593-2834
## 1376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MS, AMFT  
## 1378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Are you looking for a therapist who understands boundaries can be terrifying yet necessary to set & enforce? A therapist who can be frank with you when needs be? Or maybe a therapist who can find a tv show or movie to better convey pretty much any life occurrence? On a serious note, therapy can be hard, but necessary maintenance of the mind, & though it shouldn’t be taken lightly it doesn’t have to be daunting either. ⠀⠀⠀ ⠀ ⠀⠀⠀⠀ ⠀ ⠀ ⠀⠀⠀⠀⠀ ⠀⠀⠀
## 1379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 361-0392
## 1380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 1382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Let go of anxiety, work related stress, and unhealthy coping behaviors. Learn new skills for healthy peer cultivation, trustworthiness, and release anxiety related to traumatic events. This is the best time to cultivate sound skills for better life decisions including "moving on", forgiveness, and healing from trauma related events!  
## 1383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (747) 220-0439
## 1384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 1386                                                                                                                                                                                                                                                                                                                                                                                     As a therapist, I pride myself on being aware of people's unique qualities and characteristics. I am empathetic, structured, honest, and will challenge you so that your progress is observable and empowering. Life gets complicated sometimes, and it feels like there are issues you cannot resolve on your own. That's where I come in. As your therapist I want your experience to be insightful, healing and supportive, so that you can grow and resolve these issues independently. I have experience working with all age groups, however, my primary focus is therapy with adults.
## 1387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 403-0236
## 1388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1390                                                                                                                                                                                                                                                                                                                                                                              You're tired of feeling like you just can't get your shit together. No matter what you do, how many extra hours you put in at work or school, or tasks you take on at home, things feel pointless. The stress just keeps mounting and you're starting to wonder if you're burnt out. Imagine feeling solid. Imagine really believing in the work you do, your talents and skills, and having that self-assured and confident sense of calm that always feels so elusive. You live a life that doesn't constantly feel like it needs an escape button. Can you picture it? I can help you get there.
## 1391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 370-1749
## 1392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Marriage & Family Therapist, LMFT   
## 1394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        I am a eclectic therapist who believes in treating the whole person. My motto is “ One size does not fit all”. Making the choice to attend therapy is often difficult no matter the reason. However, it’s also the first step in putting you first. No matter the reason that lead you here I will work with you to achieve your goals and develop skills needed to maintain your progress. On the other side of Hope there is happiness.
## 1395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 310-1568
## 1396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Psychologist, ThM, PsyD  
## 1398                                                                                                                                                                                                                                                                                                                                                                          Sometimes it feels like life has dealt a tough hand. Though the sun is always shining, the clouds are sometimes in the way. The rain may at times roll in like a storm. During these times, finding the silver lining all on your own is challenging and it's okay to get the help you need to pull through. Depression, anxiety, trauma, relational issues? I can help. Do you need spiritual or Christian counseling? I can help. Feeling tired or in a rough patch? I can help. Or, are you simply trying to figure out what life is all about? Yup, I can help with that too. www.LifeBrightNow.com
## 1399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 677-4980
## 1400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist Associate, AMFT, MBA  
## 1402                                                                                                                                                                                                                                                                                                                                                                                                                           In this day and time, Mental Health is something that is not only overlooked but often misunderstood.  I am a marriage and family therapist that focuses on maturational challenges faced throughout the life span. I have extensive experience working with individuals (children and adults), couples, and families experiencing challenges with adjusting to a new family or life dynamic. I work with them to become the author of their own story through these challenges of life, whether they are personal, with family, school, or workplace.
## 1403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 701-0649
## 1404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1406                                                                                                                                                                                                                                                                                                                                           What's standing in the way of you having a healthy relationship? Relationships are challenging. Finding one and maintaining a healthy one can feel even tougher. Whether we didn’t learn the skills to do so or our past hurts are getting in the way, we often find ourselves stuck or unsure how to form lasting and meaningful relationships.  Let’s work together to uncover unconscious beliefs holding you back and heal past traumas impacting your ability to love yourself and be content in your relationships. Together we can discover effective ways to express your inner most feelings, unmet needs, and rekindle love.
## 1407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 361-1498
## 1408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1410                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Shanoan is a Licensed Clinical Social Workers with over 10 years of experience.  She is committed to  equipping  and empowering women to live healthy, flourishing lives. She is  unique in that, she takes a holistic approach to addressing mental health issues by targeting additional areas of well-being such as: physical health, spiritual health, social-emotional health, social equity, community/social support systems, and intersectionality.  She believes, true healing is all encompassing.
## 1411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 310-0573
## 1412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1414                                                                                                                                                                                                                                                                                                                                                                                                                                                     The success of my clients is their commitment to therapy.  This is the client’s biggest accomplishment, beginning something that they likely thought was impossible.  Similarly, when clients can set clear, specific goals they become attainable.  Self-acceptance is also success for my clients.  Once my clients have developed self-acceptance, then they can understand their feelings and emotions. I support my clients by helping them reduce the intensity of their symptoms by developing healthy coping skills.
## 1415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 431-2723
## 1416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1418                                                                                                                                                                                                                                                                                                                    Are you a woman in your 20's, 30's or 40's who is struggling with anxiety, depression, relationship/sex issues, career concerns, stress, low self-esteem, or difficult emotions like fear, anger, & sadness? Are you trying to find your path, yet feel blocked by self-doubt? Trying to find or maintain a partner, yet often feel alone? You may feel stuck or behind in life-burdened by your past, worried about your future, and overwhelmed by the present. If you need help healing old wounds and learning to master daily life with courage, calm, strength and resiliency, we all need help sometimes. Reaching out for help is a sign of strength.
## 1419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 927-1086
## 1420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 1422                                                                                                                                                                                                                                                                                                                 Are you struggling with motherhood? Ashamed about your thoughts surrounding your child, partner or yourself. Finding it difficult to balance motherhood and work/entrepreneur goals? Navigating motherhood can be lonely and each mom or mom-to-be struggles in different ways. During this journey called motherhood, you deserve to be supported to alleviate your unique challenges and vulnerability.I am passionate about helping women find their way through unpleasant thoughts and emotions relating to motherhood. Most importantly, I strive to form a meaningful relationship with my clients. I believe the client is the expert in their own life.
## 1423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 514-7711
## 1424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Counselor, LMHC, LCSW, MHC-LP, Interns  
## 1426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Expansive Therapy is a bicoastal therapy practice with locations in New York City and Los Angeles. We offer online therapy to individuals, couples, and families anywhere in New York State and California State. We have a diverse team of therapists offering a wide variety of modalities and specialties, and we match you with the therapist who best meets your needs. Our website is expansivetherapy.com and you can reach for more information there!
## 1427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (415) 799-1239
## 1428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, LMFT, APCC  
## 1430                                                                                                                                                                                                                                                                                                                                                                                                                                                      I am dedicated to meeting you where you are and assisting you with identifying and reaching your ultimate goals in life. Together we will work on establishing effective coping skills, which will help you with improving your daily living. I believe that the purpose of therapy is to provide you with a safe space, which is culturally sensitive to your individualized needs and situations. Though the past cannot be changed, your past is a part of your priceless journey of healing, growth, and perseverance. 
## 1431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 745-2671
## 1432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 1434                                                                                                                                                                                                                                                                                                                    Healing can be a profoundly satisfying and yet also difficult process. In life we can accumulate wounds from our childhood, from our past relationships, and even from our relationship with ourselves. These scars can make us feel lonely, defeated, and overwhelmed. Therapy involves mending these scars of our past.  I specialize in work with men. As males, we frequently try to "fix" situations. But fixing can leave us stuck when it doesn’t address the deeper emotions. I collaborate with you to identify obstacles that prevent you from becoming your best self. Together we will identify the distinctive traits that make you who you are.
## 1435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 392-6598
## 1436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1438                                                                                                                                                                                                                                                                                                                                                                                               Welcome! I’m glad that you are here. You’ve taken the first steps towards the relief and clarity you deserve. Connecting with the right therapist is essential to the healing process and I hope to help in making your journey a lot lighter. I’m open and available to answer any questions you may have about the therapy process if this is your first time seeking help. I work with adults struggling to manage the grief of life that may show up in the form of anxiety, chronic stress, self doubt, guilt and depression. I’m here to help you find or regain your power!
## 1439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 407-3688
## 1440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1442                                                                                                                                                                                                                                                                                                                                   Hi there, I'm Crystal, a Licensed Clinical social worker with over 8 years of experience in the field. I am proudly born and raised in Inglewood, California. My experience includes field-based mental health, outpatient, hospice, psychiatric inpatient hospital setting, group homes, and currently private practice. I have helped people with anxiety, depression, stress, relationship issues, personality disorders, and more. My diverse, universal approach creates a safe and supportive environment while challenging my clients.  I use Acceptance and Commitment (ACT), CBT, DBT, Person-Centered, and Psychodynamic modalities.
## 1443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 730-7954
## 1444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Marriage & Family Therapist Associate, ASW  
## 1446                                                                                                                                                                                                                                                                                                                                                                                                                                        When we understand the relationship between our thoughts, feelings, and behaviors, we can create long-lasting change. Therapy is an opportunity to learn about ourselves, begin the healing process, and most importantly, get some relief. I have spent many years working in treatment programs, focusing on mental health and addiction. While substance abuse therapy is centered on building coping skills and learning relapse prevention strategies, I work with clients to understand the relationship they had with substances. 
## 1447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 362-5712
## 1448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1450                                                                                                                                                                                                                                                                                                                                                                                                                                                            The majority of my clientele are insightful, high-achieving professionals who have excelled in their careers but have come to a place in their lives where they now feel stuck. They know that the skills they have used to get them where they are in life, are not enough to get them to where they want to be. Maybe they are excellent in their professional lives but want to improve their relationships with their loved ones. Perhaps they work great alone but have difficulty sharing the load with others.
## 1451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 504-7617
## 1452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Counselor, LMHC, LCSW, MHC-LP, Interns  
## 1454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Expansive Therapy is a bicoastal therapy practice with locations in New York City and Los Angeles. We offer online therapy to individuals, couples, and families anywhere in New York State and California State. We have a diverse team of therapists offering a wide variety of modalities and specialties, and we match you with the therapist who best meets your needs. Our website is expansivetherapy.com and you can reach for more information there!
## 1455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (415) 799-1239
## 1456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                My practice is grounded in the belief that greater insight into our emotions, thoughts, and motivations can bring us closer to our highest selves.  I provide a judgment-free space where clients can build self-compassion and feel that their voices are heard.
## 1459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (747) 269-1400
## 1460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Marriage & Family Therapist, LMFT, ATR-BC  
## 1462                                                                                                                                                                                                                                                                                                                                                                                                                                   Faced with the demands of modern life, it is easy to feel disconnected and resigned in the areas of life that matter most to us. Unexpected events that may be regarded as “interruptions” in life can exhaust our current coping skills and lead to overwhelming emotions like anxiety, depression and grief; inner and interpersonal conflicts, and loss of normal functioning. Restoring your life to one of health, vitality, and a connection to the things that matter most to you, starts with the relationship you have with yourself.
## 1463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 252-3234
## 1464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                My therapeutic style can be described as client-centered. I am extremely passionate about meeting a client where they are through empathy, genuineness, and unconditional positive regard. Additionally, providing a safe and non-judgmental environment for the client to share.
## 1467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (510) 518-3080
## 1468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           There are times when it’s tough to recognize that navigating our life's challenges, has put us into survival mode, opening the door for increased mental and physical distress in our daily lives. Oftentimes this can lead to issues within our relationships, both personally and professionally. Life has a way of exposing us to discomfort over and over, making it hard at times to determine which way is up, and what action will lead us to personal fulfillment and success.
## 1471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 217-8609
## 1472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 1474                                                                                                                                                                                                                                                                                                                                                                                  Thank you for reviewing my profile. Looking for a therapist can be mutually daunting and exciting. It takes a tremendous amount of courage and vulnerability to decide to get support in any area of your life, and I am available to empower and guide you on your therapeutic journey. I offer a Relational Gestalt approach to therapy, which means that we build an alliance together focusing on embodiment and what is present for you in the moment. I bear witness and support you in increasing your awareness of your experience as we share space for your transformational healing.
## 1475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 387-3578
## 1476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist  
## 1478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           I am pleased that you have begun your journey of healing and wellness now. My name is Margarette and I am a psychodynamic therapist practicing via Telehealth. I obtained my Master’s degree in Clinical Psychology From Phillips Graduate Institute, and my Bachelor’s degree in Psychology from Antioch University in Los Angeles. I have worked with a varied and diverse population including infants, children, adolescents, adults and families.
## 1479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (209) 340-3067
## 1480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 1482                                                                                                                                                                                                                                                                                                                                                                                    As a Trauma-Informed therapist, I believe Transitional Age Folx deserve support. I support clients who are dealing with past trauma or other disheartening experiences and want to rebuild confidence. I always start from a brave look at their unique strengths to develop and implement coping strategies that actually work. My role during the therapeutic process is to be a non-directive affirming cheer-leader, with valuable awareness of our innate ability to thrive. I show up for all sessions non-judgmental, empathic, and genuine and I welcome first-time therapy seekers! 
## 1483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 1484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1486                                                                                                                                                                                                                                                                                                                                                                                             As a licensed therapist and the founder of Makepeace Therapy, I have been working with individuals and couples in California for over 9 years. Throughout my life and in my practice, I have continuously experienced that people can heal from the suffering past trauma has created in their lives. I am so passionate about therapy because it allows for an incredible unfolding process to discover the root of our pain, change unwanted patterns and behaviors, and allow for the creation of the necessary changes that lead to living fulfilled, healthy, and joyful lives!
## 1487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 495-8553
## 1488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Associate Clinical Social Worker, ACSW  
## 1490                                                                                                                                                                                                                                                                                                                 Life is a journey and every small step you take in therapy is a step in the right direction. My goal is to provide an empathic and engaging atmosphere where you will experience safe, compassionate, and non-judgmental interaction as we navigate your journey together. I believe in a client-centered approach and that you are the change-maker who holds the power to guide your journey. I believe that each person has unique impressions and experiences, so my treatment is tailored to your individual needs. I hope to work with you in exploring your emotions and experiences, to help you develop some tools that can make life’s journey easier.
## 1491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (949) 694-8496
## 1492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Psychologist, PhD, MSEd  
## 1494                                                                                                                                                                                                                                                                                                                    I work with men and women who are seemingly successful and happy but deep down inside feel lost, alone, even if they are in a relationship, and often feel like they don't belong or struggle to be present in life. I treat anxiety and depression through examining unconscious cognitive distortions and repetitive coping mechanisms as well as deep-rooted inner conflicts, shame, guilt, insecurity, family of origin and childhood trauma that manifest in perpetuating self-doubts, career dissatisfactions and relationship/intimacy difficulties. Clients with prior therapy experiences often report making progress in our initial work together.
## 1495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (714) 464-7616
## 1496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Clinical Social Work/Therapist, LCSW, INT-SEP  
## 1498                                                                                                                                                                                                                                                                                                                                              Hi, my name is Kayla and my hope is to continue to support individuals in navigating the effects of daily stress and anxiety to more complex issues of depression and post traumatic stress disorder. Whether it's learning to understand our own mental health or just gain a better understanding of our own thoughts and feelings, I believe that each of us hold the ability to heal, and in doing so, find what helps us thrive. My approach to each session is to provide a safe space for clients to be at ease in the present and gain clarity while exploring, challenging and healing core wounds, values and behaviors. 
## 1499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 373-9421
## 1500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1502                                                                                                                                                                                                                                                                                                                                          Helping you reach your most significant potential by managing yourself. I have success in assisting people in accomplishing their goals by utilizing active listening and unconditional positive regard to establish a therapeutic relationship where you will feel emotionally safe. I have an effective range of therapeutic experience developed from my combined 21 years of experience as a teacher and therapist. Acceptance and Commitment Therapy, Dialectic Behavior Therapy, Cognitive Behavior therapy, Behavioral Analysis, and Client-Centered Therapy are a few of the tools I use to deliver direct counseling services.
## 1503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (650) 420-4588
## 1504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist Associate, MA, AMFT, APCC  
## 1506                                                                                                                                                                                                                                                                                                                                                                                                               Do you notice a disconnect lingering between your child and others… maybe even you? Do you struggle to understand why your child is acting out of character or doing things they shouldn’t be doing? Are you finding it difficult to be there for them in ways that are helpful? Negative thoughts and emotions can be experienced from any age, including times that don’t always make sense to many adults and parents. Sometimes the best of intentions can come across as invalidating or belittling, which can result in anxiety, depression, or even trauma.
## 1507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (747) 318-5074
## 1508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                My name is Krystal Johnson, and I'm a Licensed Clinical Social Worker in the state of California.
## 1511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (858) 723-0216
## 1512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Psychologist, MS, LEP, BCBA  
## 1514                                                                                                                                                                                                                                                                                                                      Have you or your child ever talked about feeling "different" or "out of place"? Maybe you struggle to identify with the people & world around you. Perhaps, as a young adult, you feel unprepared for "adulting", frustrated and/or overwhelmed. These are common thoughts of my clients; pre-teens, teens & young(ish) adults who want support whether struggling with school, work stress, socializing, or mental health in general.  I offer counseling, psychoeducational assessments, & parent consulting for IEP/504 plan. All of my services aim to help you learn more about who you truly are, and through that self-awareness, healing can begin.
## 1515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 396-0021
## 1516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 1518                                                                                                                                                                                                                                                                                                                  Are you experiencing Hopelessness, Sadness, Worthlessness, Panic Attacks, Racing Thoughts, or Fear? Do you lay awake at night WORRYING about EVERYTHING? Are your worries or fears a constant cycle? Do you avoid interaction with loved ones, or maybe you don't want to be a burden to family or friends, so you begin isolating from everyone? Do you ever say, “I can’t take this anymore?” Do you feel alone in your problems? You are not alone, whether you're dealing with Anxiety, Depression, Relationship Issues, Health Crisis, Midlife Crisis, or just unsure how to move forward in life, assisting adults redefine life is my passion & purpose.
## 1519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 736-2408
## 1520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Psychologist, PhD, MSEd  
## 1522                                                                                                                                                                                                                                                                                                                    I work with men and women who are seemingly successful and happy but deep down inside feel lost, alone, even if they are in a relationship, and often feel like they don't belong or struggle to be present in life. I treat anxiety and depression through examining unconscious cognitive distortions and repetitive coping mechanisms as well as deep-rooted inner conflicts, shame, guilt, insecurity, family of origin and childhood trauma that manifest in perpetuating self-doubts, career dissatisfactions and relationship/intimacy difficulties. Clients with prior therapy experiences often report making progress in our initial work together.
## 1523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (714) 464-7616
## 1524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 1526                                                                                                                                                                                                                                                                                                                  Are you experiencing Hopelessness, Sadness, Worthlessness, Panic Attacks, Racing Thoughts, or Fear? Do you lay awake at night WORRYING about EVERYTHING? Are your worries or fears a constant cycle? Do you avoid interaction with loved ones, or maybe you don't want to be a burden to family or friends, so you begin isolating from everyone? Do you ever say, “I can’t take this anymore?” Do you feel alone in your problems? You are not alone, whether you're dealing with Anxiety, Depression, Relationship Issues, Health Crisis, Midlife Crisis, or just unsure how to move forward in life, assisting adults redefine life is my passion & purpose.
## 1527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 736-2408
## 1528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Associate Clinical Social Worker, ACSW  
## 1530                                                                                                                                                                                                                                                                                                                 Life is a journey and every small step you take in therapy is a step in the right direction. My goal is to provide an empathic and engaging atmosphere where you will experience safe, compassionate, and non-judgmental interaction as we navigate your journey together. I believe in a client-centered approach and that you are the change-maker who holds the power to guide your journey. I believe that each person has unique impressions and experiences, so my treatment is tailored to your individual needs. I hope to work with you in exploring your emotions and experiences, to help you develop some tools that can make life’s journey easier.
## 1531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (949) 694-8496
## 1532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Clinical Social Work/Therapist, LCSW, INT-SEP  
## 1534                                                                                                                                                                                                                                                                                                                                              Hi, my name is Kayla and my hope is to continue to support individuals in navigating the effects of daily stress and anxiety to more complex issues of depression and post traumatic stress disorder. Whether it's learning to understand our own mental health or just gain a better understanding of our own thoughts and feelings, I believe that each of us hold the ability to heal, and in doing so, find what helps us thrive. My approach to each session is to provide a safe space for clients to be at ease in the present and gain clarity while exploring, challenging and healing core wounds, values and behaviors. 
## 1535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 373-9421
## 1536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1538                                                                                                                                                                                                                                                                                                                   Transformative HEALING begins only when we graciously surrender to the knowing that we and only we can uniquely heal ourselves. Identifying, dissolving, and eliminating the causality of unhealthy thoughts, beliefs, negative internal dialogues that perpetuates unhappiness & suffering. Forgiveness releasing emotional baggage of those who have physically, emotionally, or psychologically harmed us is the ultimate healing. Believe in the knowing nothing can stop or hinder our WILL and desire to heal our magnificent, marvelous, and loving selves. YOUR DIVINE, creators, sustainers of peace, happiness, joy, & LOVE we deservingly desire!!!
## 1539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (909) 655-4084
## 1540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1542                                                                                                                                                                                                                                                                                                                                                                                              If you're looking to improve your relationship please visit onlinelmft.com and join our free relationship course. I want to help you make your life better! Let's take control back of your life and relationships. Together we can end unnecessary stress, cope with the challenges life will throw at us, and build a life of resilience and inner peace. My Online Practice is built to serve you. It's convenience will save you time. Meeting where you are increases privacy and access. Make the call to me, you're worth the time and investment. I can't wait to meet you!
## 1543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (559) 785-3347
## 1544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 The ultimate goal of therapy is to heal and experience personal growth while being supported throughout  the process. I provide a nurturing supportive environment and allow you the opportunity to explore the challenging issues you  face in your daily life.
## 1547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 414-5272
## 1548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 1550                                                                                                                                                                                                                                                                                                                                                                                                           Engaging in psychotherapy is a positive step toward realizing a satisfying life.  Through a safe, trusting, confidential relationship with an experienced therapist, the process helps you find relief and feel better. Psychotherapy can provide relief from ongoing, unwelcome feelings such as:  sadness, loneliness, anxiety, depression, confusion, fear or anger. Whoever you are, happiness, joy and ease are not elusive. Begin the practice of experiencing relationship  to self and others from a place of  curiosity, integration, regulation and clarity.
## 1551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 259-3996
## 1552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Marriage & Family Therapist, LMFT, MBA  
## 1554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Would you like to make some small changes that will have a BIG impact on your family-or professional-life? Are you or your child experiencing stress and frustration dealing with friendships or family relationships? Are teachers and family members saying your child's behavior is out of control? Do you wish you could talk to your parent or child without yelling or always having it turn into a fight? If you do, I'd love to help.
## 1555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 294-8925
## 1556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Drug & Alcohol Counselor, LMFT, LAADC , E500RYT, EMDR, ISTDP  
## 1558                                                                                                                                                                                                                                                                                                                 Do you wonder if you’re an addict, maybe not? I provide assessments and interventions for addiction. I’ve worked with famous actors, directors, major league athletes, scholars, scientists, studio executives, engineers, Hip Hop moguls and successful individuals. I specialize in trauma and addiction. I deal with issues such as controlled drinking, sobriety, relationship, couple's or family issues, Court, incest survivor trauma, and addiction issues.  I am also a Yoga and Meditation Therapist and somatic Therapist which gives me a unique ability to help my patients integrate in their bodies emotionally and mentally. As well as an LMFT.
## 1559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 531-5725
## 1560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist Associate, AMFT  
## 1562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      We are perfectly designed.  However, life can throw us a curve ball.  We will work together and through the challenge for your healing.  I desire to work with you in mending troubled relationships and fulfilling your hopes and dreams.  If you or your loved one feels abandoned, depressed, confused about life, angry, dreading change, wanting to hurt others or self, or just want someone to talk too, come see me or lets talk by video medicine.
## 1563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (909) 443-2376
## 1564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Marriage & Family Therapist, LMFT   
## 1566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             It is my God-given purpose and destiny to help Christians live in emotional freedom. I chose to become a Christian Therapist because of the body-soul-spirit connection. Along with this, I believe to help individuals achieve long lasting results, all three elements should be treated together in order to bring a person to wholeness.  My treatment approach for helping an individual is to assist him/her with looking at symptoms through a holistic lens.
## 1567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 790-1744
## 1568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Drug & Alcohol Counselor, PsyD, MHD, CATC-V, SUDCC, LAADC  
## 1570                                                                                                                                                                                                                                                                                                                                                                            Our Mission At Dedicato Outpatient Services is to provide responsible and comprehensive Intensive Substance Abuse Treatment that will enhance our patient’s ability to achieve optimal mental health and recovery from chemical dependency. We are dedicated to treat the whole person as well as the primary problem. We  treat every patient, family, friend, and staff, with dignity and respect. We are licensed by the California Department of Health Care Services and accredited by the Joint Commission. We are among only 6% in the United States with this highest level of accreditation.
## 1571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 322-2931
## 1572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, DSW, LCSW  
## 1574                                                                                                                                                                                                                                                                                                                      Thelese Consulting Group is an organization of services focused on consulting, management training, leadership development, and mental health services. It is founded to assist organizations and professionals in developing practical skills to manage workplace issues and personal conflict. Thelese has partnered with entertainment, government agencies, behavioral healthcare organizations, and nonprofits to provide employee assistance programs, webinar training, crisis interventions, and in-person training nationwide. Thelese Consulting Group pride itself in having a diverse staff of clinicians with bilingual & ASL. We are virtual.
## 1575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 312-5078
## 1576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Hello, welcome to my private practice. As a therapist, I see many clients who are intelligent, hardworking, and loving, unconsciously fall into patterns of  self sabotage.  Struggling daily with thoughts that create anxiety and depression; making life feel dull and heavy. Our own brain can sometimes be our worst enemy.
## 1579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (949) 860-1961
## 1580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    I am a Licensed Clinical Social Worker and a graduate of Clark Atlanta University Social Work graduate program with a focus on mental health.
## 1583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (747) 318-4502
## 1584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 1586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Tired of feeling overwhelmed, unhappy about your career or family life, frustrated by relationship issues, or desperately trying to find relief from sadness or anxiety? Together we can embark on a journey that explores who you are and where you want to be, uncovering your strengths, needs, fears, desires, and everything else in between. With this knowledge we can discover together how you can live your best life!
## 1587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (714) 597-6821
## 1588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist  
## 1590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Keith McGowen, LMFT, PPSC2. Keith is skilled in treating trauma, depression, anxiety, couples and family/parent education. Keith is passionate about helping people develop positive functionality in their lives.
## 1591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 242-3062
## 1592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 1594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Life can feel overwhelming. An unexpected event can suddenly throw everything off balance, or many smaller stresses can build up and make it hard to cope with everyday tasks. Together we can explore your inner strengths and how to use them moving forward and find healing throughout the process. I am dedicated to social justice and believe that it’s important to find awareness of one’s resilience in the process of self-discovery and acceptance.
## 1595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 581-1774
## 1596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Counselor, MA,  SLC, LMHC, ATR-BC  
## 1598                                                                                                                                                                                                                                                                                                                                                            Are you looking for a non-traditional therapist?  I integrate my spiritual life coaching training and the practice of art-making into the therapeutic process in a way that honors who you are wholistically. This wholistic approach is based on the psycho-spiritual therapeutic modality, which is grounded in the notion that “the soul is the starting point for balance.” This approach to treatment takes into consideration the WHOLE of who you are, be it physically, emotionally, spiritually, intellectually, culturally, etc. and examines how your lived experiences have impacted your mental health. 
## 1599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (505) 390-8899
## 1600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Hello! I am a Licensed Clinical Social Worker with over 40 years of clinical experience. I would welcome the opportunity to talk with you about what is on your heart.
## 1603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 456-1452
## 1604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1606                                                                                                                                                                                                                                                                                                                                You are more than your bad days. You are more than other people's judgement and definition of success. This is my hope for the teens, dancers, and student-athletes I work with; that they are able to believe this and learn techniques to manage their thoughts, feelings, and behaviors. The teenagers I work with experience a lot of worry and fear. They are struggling with ongoing expectations of school, family, athletic goals, peers, and society. They often don't feel seen or heard which can cause low self-esteem, lack of motivation, poor relationships, and sadness. However, there is a desire to find solutions and relief.
## 1607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 278-0620
## 1608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Marriage & Family Therapist, LMFT   
## 1610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             It is my God-given purpose and destiny to help Christians live in emotional freedom. I chose to become a Christian Therapist because of the body-soul-spirit connection. Along with this, I believe to help individuals achieve long lasting results, all three elements should be treated together in order to bring a person to wholeness.  My treatment approach for helping an individual is to assist him/her with looking at symptoms through a holistic lens.
## 1611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 790-1744
## 1612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, DSW, LCSW  
## 1614                                                                                                                                                                                                                                                                                                                      Thelese Consulting Group is an organization of services focused on consulting, management training, leadership development, and mental health services. It is founded to assist organizations and professionals in developing practical skills to manage workplace issues and personal conflict. Thelese has partnered with entertainment, government agencies, behavioral healthcare organizations, and nonprofits to provide employee assistance programs, webinar training, crisis interventions, and in-person training nationwide. Thelese Consulting Group pride itself in having a diverse staff of clinicians with bilingual & ASL. We are virtual.
## 1615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 312-5078
## 1616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1618                                                                                                                                                                                                                                                                                                                   I have extensive experience in individual, group, and family therapy. I received my BA degree at the University of California, Los Angeles, then attended graduate school at the University of Southern California (USC) where I received my MSW degree in Social Work with an emphasis on Mental Health. I place an emphasis on crafting individualized, holistic, strength-based treatment plans to best fit the unique needs of each patient and their family. I specialize in treating depression, anxiety, and various other mood disorders, including bipolar disorder; as well as attention-deficit/hyperactivity disorder and substance use disorders.
## 1619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 897-8731
## 1620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1622                                                                                                                                                                                                                                                                                                                                                                          Hello and welcome. I know this is hard. It is always difficult for a proud person to seek help. It is much more harmful to not reach out, I commend you.  Human beings are social animals, we need and desire the comfort of one another. How we meet those needs can be complex. My job as your therapist is to assist you in becoming the best person you can be. I provide individual, relationship, and family therapy. I have a humanistic approach, allowing you to be you. I accept you as you are. Therapy is not to change the person it is to change the way the person perceives themselves.
## 1623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 499-2977
## 1624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 1626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      I  help adult individuals with a history of developmental trauma repair attachment injuries and thrive in their present-day relationships. As a team, we collaborate to make sense of these experiences, develop a toolkit of adaptive skills, and establish a safe space to promote post-traumatic growth.
## 1627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (470) 592-8978
## 1628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Drug & Alcohol Counselor, PsyD, MHD, CATC-V, SUDCC, LAADC  
## 1630                                                                                                                                                                                                                                                                                                                                                                            Our Mission At Dedicato Outpatient Services is to provide responsible and comprehensive Intensive Substance Abuse Treatment that will enhance our patient’s ability to achieve optimal mental health and recovery from chemical dependency. We are dedicated to treat the whole person as well as the primary problem. We  treat every patient, family, friend, and staff, with dignity and respect. We are licensed by the California Department of Health Care Services and accredited by the Joint Commission. We are among only 6% in the United States with this highest level of accreditation.
## 1631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 322-2931
## 1632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Counselor, MA,  SLC, LMHC, ATR-BC  
## 1634                                                                                                                                                                                                                                                                                                                                                            Are you looking for a non-traditional therapist?  I integrate my spiritual life coaching training and the practice of art-making into the therapeutic process in a way that honors who you are wholistically. This wholistic approach is based on the psycho-spiritual therapeutic modality, which is grounded in the notion that “the soul is the starting point for balance.” This approach to treatment takes into consideration the WHOLE of who you are, be it physically, emotionally, spiritually, intellectually, culturally, etc. and examines how your lived experiences have impacted your mental health. 
## 1635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (505) 390-8899
## 1636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 1638                                                                                                                                                                                                                                                                                                                  SMOKING CESSATION VIRTUAL GROUPS AVAILABLE.  Is stress, anxiety, panic, or pain ruining your life? Or were you recently diagnosed with a chronic/terminal illness or currently living with one?  I can help. I specialize in stress management, anxiety, health anxiety / hypochondria, pain management, panic, smoking cessation, and support for those living with chronic illness (e.g., cancer, HIV). I utilize short-term cognitive behavioral therapy (CBT), relaxation /meditation, mindfulness, and cognitive restructuring techniques to get you back to living your life. Phone / video sessions only for CALIFORNIA residents and FLORIDA residents.
## 1639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (628) 222-4058
## 1640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    I am a Licensed Clinical Social Worker and a graduate of Clark Atlanta University Social Work graduate program with a focus on mental health.
## 1643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (747) 318-4502
## 1644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                We are a team of therapists and life coaches who value our relationships with our clients. When life experiences have clouded our ability to have clarity, we see you and strive to help you connect with your authentic self.  We also find it important to recognize how social constructs, family dynamics, and societal norms have impacted our way of being and self-image.  To understand this is to better understand you.
## 1647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 500-0971
## 1648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 1650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Tired of feeling overwhelmed, unhappy about your career or family life, frustrated by relationship issues, or desperately trying to find relief from sadness or anxiety? Together we can embark on a journey that explores who you are and where you want to be, uncovering your strengths, needs, fears, desires, and everything else in between. With this knowledge we can discover together how you can live your best life!
## 1651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (714) 597-6821
## 1652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, LMFT, CBT for, Adult, ADHD  
## 1654                                                                                                                                                                                                                                                                                                                        I help ADHD adults and anxious over-thinkers conquer procrastination, overwhelm and imposter syndrome, so they can achieve their goals and live an unapologetically fulfilling life. Ready to work with someone who finally gets you? I'm one of the only therapists in the US who is both nationally certified in CBT and exclusive to adult ADHD (and the anxiety & depression that annoyingly tags along with ADHD). I know how hard you're trying, and I'm uniquely qualified to help! Let's create a strategic plan tailored to you and your unique brain, so you can organize your life, improve your relationships, and finally crush those goals.
## 1655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (617) 766-0638
## 1656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1658                                                                                                                                                                                                                                                                                                                     Do you have an anger problem? Have your angry outbursts become problematic?  Nothing seems to be going right for you. You experience one major disappointment after another.  Your wife or significant has expressed her dissatisfaction with the quality of your relationship. You don’t feel like you measure up. Despite this being a major area of concern, you refuse to admit it, because you fear being judged or shamed. You might think asking for help is a sign of weakness. Being open and honest about what’s going on feels too risky. Talking about and expressing your feelings is out of the question. Who can you trust? How can you cope?
## 1659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (559) 254-4838
## 1660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Clinical Social Work/Therapist, LCSW, LICSW  
## 1662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          When you are faced with trauma, loss, relationship problems, or other life challenges, it is easy to isolate yourself, blame yourself for what you are experiencing, and to believe that things will never get better.  As your therapist, I will be your partner on your journey to healing.  I will hold hope for you when all hope seems lost, and help you rebuild your optimism through recognizing your strengths and resilience.
## 1663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (206) 312-6117
## 1664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Clinical Social Work/Therapist, LCSW, PMH-C  
## 1666                                                                                                                                                                                                                                                                                                                                                                   Hello There! Thank you for joining me in this space. I understand how difficult it can be to initiate first contact when seeking therapy. I believe that the first step is often the most challenging but your decision to show up today is half the battle. Whether you are struggling to adjust to life transitions, experiencing depression, anxiety, grief & loss, relationship conflict, or trauma, there is hope and things can improve. I aim to help you discover your true self and your strengths while adjusting to life’s challenges. Allow me to guide you as we undertake this process together.
## 1667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (925) 406-3068
## 1668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Marriage & Family Therapist, LMFT   
## 1670                                                                                                                                                                                                                                                                                                                 "Real change, enduring change, happens one step at a time" - Ruth Bader Ginsburg.                                                                    Change will look different for everyone, especially depending on the goals you have set for yourself. Sometimes, the realization that there are other possibilities (and that hope for a better future can even exist) is the very first step. Maybe you have realized that you are ready to explore your potential and to develop more insight into how you are engaging with the world around you.  I would be honored to guide you on this journey to increase clarity, self-awareness, and empowerment.
## 1671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (248) 422-0690
## 1672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Integrating a solutions-oriented approach, behavioral therapy, and empathy, I work with clients to create a challenging yet empowering vortex for change. In my work, one size does not fit all, so creating a strong therapeutic alliance is of utmost importance. I aim to walk alongside you on the path towards finding, empowering, and affirming oneself, time and time again.
## 1675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (760) 273-3876
## 1676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Registered Psychological Assistant, PsyD  
## 1678                                                                                                                                                                                                                                                                                                                                                                                                                                                                 My work is focused on initiating healing from the moment you walk through my door. And I recognize it takes a lot of courage to be in the room, with me as your therapist, while beginning this journey of deeper understanding of self and change. Together we will look inward at the fragmented pieces of your life, which can often be intimidating, but you won't be made to feel alone in this process. I will help you put the pieces of your life together so you can develop a stronger sense of self. 
## 1679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 306-3152
## 1680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Clinical Social Work/Therapist  
## 1682                                                                                                                                                                                                                                                                                                                                                                                                                                           Everyone has mental health! Good mental health is the foundation of life. There exists a vast number of individuals with varying degrees of uniqueness, including strengths and areas needing work (issues and challenges). There are those who have goals and an idea of what they need and want. Then there are those who have no idea what they need and want, but know they just want to be and feel better. Everyone wants to be heard, their experiences and feelings validated, and to be supported. This is where I step in...
## 1683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 538-6708
## 1684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, LMFT, CBT for, Adult, ADHD  
## 1686                                                                                                                                                                                                                                                                                                                        I help ADHD adults and anxious over-thinkers conquer procrastination, overwhelm and imposter syndrome, so they can achieve their goals and live an unapologetically fulfilling life. Ready to work with someone who finally gets you? I'm one of the only therapists in the US who is both nationally certified in CBT and exclusive to adult ADHD (and the anxiety & depression that annoyingly tags along with ADHD). I know how hard you're trying, and I'm uniquely qualified to help! Let's create a strategic plan tailored to you and your unique brain, so you can organize your life, improve your relationships, and finally crush those goals.
## 1687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (617) 766-0638
## 1688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 1690                                                                                                                                                                                                                                                                                                                       We need human connection. Sometimes that connection is blocked by  fears and insecurities that keep us from showing up the way that we want in the world. Insecurities cause us to stifle our voice or shrink back from the greatness we know is within us. Fears inhibit healthy communication and problem solving. External pressures like work or parenting can cause distance in our connection with our partner, friends, and the world. At times, finding the way back to stability and security in our relationships can feel just out of reach, leaving us feeling helpless and stuck. We stop accessing our authentic self for fear of rejection.
## 1691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 762-4827
## 1692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1694                                                                                                                                                                                                                                                                                                                   I am a Licensed Marriage and Family Therapist (LMFT) who has worked with various groups and clients. If you are looking for a therapist that will listen and acknowledge your unique perspective you don't have to look any further. I have 10 years of experience working with singles, couples, military, LGBTQ, people of color, undocumented immigrants from various countries and even inmates.  In addition to my hours spent in working with varying communities, I have been highly involved as alumni from Antioch University in Los Angeles and as a current doctoral student in media psychology at Fielding Graduate University in Santa Barbara. 
## 1695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 454-1773
## 1696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Associate Professional Clinical Counselor, MS, APCC  
## 1698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Hello, my name is Tyree Griffith and I currently serve as an Associate Professional Clinical Counselor in California. I work with individuals to overcome their anxiety, depression, traumatic experiences, finding their place in life, and relationship or family conflicts. My goal is to work with you to come up with solutions to overcome these stressors or interpersonal conflicts that may be causing you to feel helpless/hopeless, lack motivation, or just stuck in life.
## 1699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (800) 430-4490
## 1700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1702                                                                                                                                                                                                                                                                                                                                                                                                                                                In this space, you are safe! Let’s be real; making the decision to embark on the path of healing is not an endeavor to be taken lightly, as it requires patience, vulnerability, and courage. Whether these are your first steps or continuing, thank you for being here. With that said, I am passionate about helping my clients unravel physical, mental, and emotional layers to find the root causes of problems and develop self-awareness and strong coping skills in order to navigate through life as their best selves.
## 1703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (650) 718-8048
## 1704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1706                                                                                                                                                                                                                                                                                                                       They say life is full of highs and lows, but lately you have been experiencing more lows. Life transitions, depression, or anxiety have caused a wedge between you and your peace. Activities that used to excite you no longer matter. You are just floating through life with no purpose or clarity; ultimately negatively affecting your self-esteem and confidence. Whenever you try to get on track and build the life you want, life or your inner thoughts seem to take you two steps backwards. You could give up but the fighter in you will not. You want to build on that determination but don't know where to start? Something has to change.
## 1707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 376-3915
## 1708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Integrating a solutions-oriented approach, behavioral therapy, and empathy, I work with clients to create a challenging yet empowering vortex for change. In my work, one size does not fit all, so creating a strong therapeutic alliance is of utmost importance. I aim to walk alongside you on the path towards finding, empowering, and affirming oneself, time and time again.
## 1711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (760) 273-3876
## 1712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1714                                                                                                                                                                                                                                                                                                                     Do you have an anger problem? Have your angry outbursts become problematic?  Nothing seems to be going right for you. You experience one major disappointment after another.  Your wife or significant has expressed her dissatisfaction with the quality of your relationship. You don’t feel like you measure up. Despite this being a major area of concern, you refuse to admit it, because you fear being judged or shamed. You might think asking for help is a sign of weakness. Being open and honest about what’s going on feels too risky. Talking about and expressing your feelings is out of the question. Who can you trust? How can you cope?
## 1715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (559) 254-4838
## 1716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Clinical Social Work/Therapist, LCSW, LICSW  
## 1718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          When you are faced with trauma, loss, relationship problems, or other life challenges, it is easy to isolate yourself, blame yourself for what you are experiencing, and to believe that things will never get better.  As your therapist, I will be your partner on your journey to healing.  I will hold hope for you when all hope seems lost, and help you rebuild your optimism through recognizing your strengths and resilience.
## 1719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (206) 312-6117
## 1720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 1722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        I am dedicated to providing a safe place where we can work through your experiences together. I understand that it is a privilege to bear witness to your vulnerability, so I will support you with compassion and a strengths-based approach. You are the expert in your life and my goal is to listen and help you identify the patterns or behaviors you have developed throughout your life that no longer serve you.
## 1723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (341) 888-6442
## 1724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        I work with my clients eclectically utilizing a Client-Centered approach always. I have been actively engaged in psychotherapy since 2006. Active listening is a primary aspect of my therapeutic facilitation. I am treatment focused in my client's best interest, and I have experience working with individuals, couples, families, and early to middle adolescent males and females.
## 1727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (209) 618-2479
## 1728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1730                                                                                                                                                                                                                                                                                                                                                                                                                                                            Sometimes, a person who isn't in your immediate circle may offer you a fresh perspective that helps you move through a difficult situation when you feel stuck! My name is Denise Billingsley, and as a Licensed Clinical Social Worker, I will help you unpack and navigate the difficulties you've indicated. Driven by my background in working with individuals who have experienced trauma, I will tailor our dialogue to meet your specific and unique needs using an effective, proven, "down-to-earth" style.
## 1731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (747) 293-3670
## 1732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 1734                                                                                                                                                                                                                                                                                                                         As a therapist, I have helped individuals, couples, and families find healing, understanding, compassion, and empathy.  With encouragement and a bit of humor, I provide safe space for my clients to change their internal dialogues.  In so changing, they can rewrite their stories with strength.  Allow me to say that no one is deserving of suffering any place in life- at school, at work, at home, or in their relationships. Sometimes, we can experience challenges in life that occur so frequently, we begin to feel like this is how life is supposed to be for us.  Ultimately, distrusting the good things, and anticipating the worse.
## 1735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (661) 463-8471
## 1736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Clinical Social Work/Therapist, LCSW, PMH-C  
## 1738                                                                                                                                                                                                                                                                                                                                                                   Hello There! Thank you for joining me in this space. I understand how difficult it can be to initiate first contact when seeking therapy. I believe that the first step is often the most challenging but your decision to show up today is half the battle. Whether you are struggling to adjust to life transitions, experiencing depression, anxiety, grief & loss, relationship conflict, or trauma, there is hope and things can improve. I aim to help you discover your true self and your strengths while adjusting to life’s challenges. Allow me to guide you as we undertake this process together.
## 1739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (925) 406-3068
## 1740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1742                                                                                                                                                                                                                                                                                                                                                   When life hits, everyone needs someone safe to talk to. A space where they can speak freely, be themselves (flaws and all), and share their pain, without their pain being used against them. There are so many good people, who carry the world on their shoulders, struggling to manage multiple roles to help everyone else on a daily basis. But who helps them when they are feeling burned out and their cup is empty? Are you experiencing challenges in your personal relationships or at work? Or maybe it's none of the above and you just feel like something is missing or you need help discovering your purpose?
## 1743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (951) 477-5209
## 1744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Licensed Professional Clinical Counselor, PhD, CRC, LPC, LPCC  
## 1746                                                                                                                                                                                                                                                                                                                                                                                        I provide trauma-informed care to the BIPOC community, individuals with disabilities, and the LGBTQ+ community. Some people belong to one, two, or all three communities and I help them with anxiety, depression, and trauma. Most of the individuals I see in therapy sessions say that they want to feel happier, find inner peace, and/or adjust better to life's transitions. Whatever your goals are for improving your quality of life, I am here to take that journey with you. I also specialize in working with couples where one partner has been diagnosed with a disability.
## 1747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (415) 873-2893
## 1748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Associate Clinical Social Worker, ASW  
## 1750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                The quality of your life is only going to be as good as the quality of your relationships with other people. The real question is - how can you create the kind of relationships that will bring you a good life?
## 1751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (916) 642-7301
## 1752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 1754                                                                                                                                                                                                                                                                                                                                                                            Do you struggle to live your life and relationships in alignment with your values, beliefs and goals? I support individuals and couples- whether due to anxiety, depression, life adjustments or past hurts. I help you learn how to build healthy relationships with yourself and others. We will address the challenges that create barriers and negative patterns that rob you of joy and create emotional discomfort. We all want to feel whole and live a life of meaning and purpose but we're not always taught the tools to get there. You don't have to figure it all out alone, I can help.
## 1755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 632-4597
## 1756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 1758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Hello, I believe you are one step closer to a new journey and a new you. I am dedicated to empowering you to reach your goals. Victory is within your reach. I understand that personal challenges and obstacles exist, but so do the solutions to overcome them. Your personal goals can be realized and your conflicts can be resolved. The past does not have to dictate and direct your future.
## 1759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (405) 645-5484
## 1760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1762                                                                                                                                                                                                                                                                                                                  Let’s face it, being a young woman in this millennial era is hard, and difficult for the teen girl emerging into the new generation as well. There is always a feeling of having a lot to live up to, there are expectations that you may feel place pressure on you, social media messages, or just a struggle to find your power in a world that can feel disempowering. It can feel very stressful, make you wonder if you will ever be good enough, or just feel a need to be perfect. I know it can feel very discouraging, however, you can find healing in rewriting your story and free yourself from life experiences that leave you mentally trapped.
## 1763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 222-5905
## 1764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Associate Professional Clinical Counselor, APCC  
## 1766                                                                                                                                                                                                                                                                                                                                                                                                                          Life transitions, whether welcomed or unwanted but needed, often seem to be too much to bear on your own. When it comes to college or career adjustment, family role or relationship changes, or grief and loss, you may not feel equipped to navigate the next chapter of your life story — even when you’re writing it for the better.  You may have developed habits, emotional resistance, or long-held beliefs that were effective in getting you through to this stage of life but are now unhelpful or even harmful for where you are going now.
## 1767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 488-6422
## 1768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Marriage & Family Therapist Intern, MS, LMFT-i  
## 1770                                                                                                                                                                                                                                                                                                                                               I help women and women of color heal by understanding your experience, processing their trauma, identifying their blind spots and triggers, learning tools to express and articulate your trauma and tools to help you become fierce negotiators. I also want you to know your rights as an employee, to know your options and how to utilize your company chain of command to your advantage and improve your work environment even if the outcome is going to another company. I am here to provide the highest level of service while individualizing your therapy experience and maintaining integrity, fairness, and honesty.
## 1771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (702) 410-7771
## 1772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1774                                                                                                                                                                                                                                                                                                                                                                                                                       ACCEPTING NEW CLIENTS --------------------------------------------------A willingness to seek support is a sign of strength. As an empathic and experienced professional, I provide support with compassion and understanding, acknowledging that you are the expert in making the change you want to see in your life. I find it important to honor you and your needs, accept you as you are, and value the unique concerns that you bring. Together we can find healthy and manageable ways for you to heal, cope, or tackle whatever you present with.
## 1775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 253-4216
## 1776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Marriage & Family Therapist, MS,  LMFT  
## 1778                                                                                                                                                                                                                                                                                                                                          Do you struggle with disordered eating, addictive behaviors, trauma, relationships issues, and/or shame around what you've been through or have done? Do you desire to live-out your authentic beliefs and purpose? Do you need someone to talk to where you won't be judged and told what to do? If you're someone who needs support, understanding, validation, authenticity, and wise counsel then you've come to the right page. If you've decided to seek help and explore what you truly need then connect with me! If you believe that change is possible, it is. Please reach out because I desire to help you on your journey.
## 1779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (949) 779-5869
## 1780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Licensed Clinical Mental Health Counselor, MA(HR), LCMHC, LPC  
## 1782                                                                                                                                                                                                                                                                                                                                     Change doesn't come without challenges right?  There are 1000's of books and years of amazing research that tells us how and when we should... However, there's no perfect algorithm or method to it. The only person who truly knows either is YOU.  If you are someone who has decided that you are ready for change and willing to face your own unique obstacles and challenges by being open-minded , trusting, transparent, vulnerable, and ideally "Perfectly Imperfect" (Tw) Let's get started today! The only thing you need to bring to our sessions is an open mind!  "We are all Perfectly Imperfect and Fabulously Flawed" (Tw)
## 1783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (704) 859-2547
## 1784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Welcome! You have taken the first step into discovering the importance of your mental well-being. Life is filled with unexpected challenges and often we have difficulty facing them. This is where having a safe space and a non-judgmental therapeutic environment can assist with your journey towards increased wellness. My specialties are Anxiety, Depression, Life Transitions, and Workplace/Caregiver Stressors.
## 1787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (951) 389-7599
## 1788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 1790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Maria has a broad range of experience working in underserved communities primarily working with survivors of trauma, women addressing post partum depression and TAY ages 16-25 who are prodromal to serious mental illness. Maria has also worked in  inpatient psychiatric hospitals and school settings with youth, families  and adults.
## 1791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 928-9352
## 1792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MS, AMFT  
## 1794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  “Bridging is the work of opening the gate to the stranger, within and without.” – Gloria E. Anzaldúa. You’re at an inflection point. A chasm appears insurmountable. The ground has shifted; you’re on rocky terrain. The trail’s end is hazy, but you catch a glimpse: the outline of a hopeful future, somehow. Neglect can match abuse in its decimation of the soul. So let us nurture those neglected pieces of yourself too long ignored.
## 1795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 742-0939
## 1796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Hello beautiful people. My most treasured skill as a therapist but most importantly as a human is the ability to connect and relate with almost any one no matter your race, gender, culture, sexual orientation, socioeconomic status, or age. I am learning in practice and in life that no matter how old, young, accomplished or established we become there will always be a natural human yearning we carry to feel like we belong and that we matter to others.
## 1799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 364-1104
## 1800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Marriage & Family Therapist, LMFT, PMH-C  
## 1802                                                                                                                                                                                                                                                                                                                   Adulting is already hard enough; throw in infertility, postpartum depression/anxiety, pregnancy following loss (heIlo, anxiety!), loss/grief/bereavement, trauma, relationship/communication issues, boundaries and family conflict and now you've got discomfort, unpleasant feelings, disconnection and stress. While we may not be able to change all of the obstacles in your life, we can certainly work collaboratively to adjust expectations, reinforce coping skills, strengthen resilience, improve communication skills, set boundaries, process trauma and elicit clarity and direction.    (This is a small, boutique group Telehealth practice).
## 1803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 366-4404
## 1804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1806                                                                                                                                                                                                                                                                                                                              I offer in person, outdoor garden sessions and do phone when needed.  I laugh a lot with my clients and even though sometimes the work can be painful, my clients usually begin to feel better and keep coming.  I work well with creative people, BIPOC, and across the spectrums of straight to LBGTQ - and mono to poly.  With specializations in Psychoanalytic, and Jungian therapy, I also draw on mindfulness and narrative approaches to help you thrive.  I collaborate with your highest functioning self to support your confused, critical, scared young parts.  The psyche is resilient and thrives on love and therapeutic attention.
## 1807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 999-5341
## 1808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1810                                                                                                                                                                                                                                                                                                                                            I truly enjoy working with clients who are seeking understanding of themselves and wanting to create some change in their lives. I also understand that true intimacy is created from the client-patient relationship, therefore it is tantamount to find the right therapist that you (the patient) feels safe/comfortable enough to say anything that is needed in order to illicit insight/change.  I ask that all my clients outline specific therapeutic goals so that together we be clear as to our purpose and stay the course of treatment. I am client-focused and open to feedback since treatment is made for the client.
## 1811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 924-6521
## 1812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 1814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Unfortunately, I am no longer accepting new patients at this time.
## 1815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 378-4819
## 1816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    PhD, MA, BA  
## 1818                                                                                                                                                                           Whether you are looking for Individual, Couple, Family or Grioup Psychotherapy, today you are one step closer to a new you. The path of personal growth is exhilarating and empowering. Regardless of the modality I use, I am solution focused and my goal is to help you discover and uncover your highest potential. While we can’t change difficult situations in the past, we can work together to transform them into powerful assets for the present and future. By applying complementary psychotherapy approaches and teniques, I will help you unearth and extinguish longstanding behavioral patterns and negative perceptions. As the result of our work together you will experience a complete transformation of mind, body and spirit. you will be walking in a totally new direction. 
## 1819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 365-8434
## 1820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Marriage & Family Therapist, PsyD, LMFT, LPCC  
## 1822                                                                                                                                                                                                                                                                                                                                                                                                                                                         There’s a lot going on in the world and sometimes it’s hard to emotionally, mentally, and physically show up. You might be stressed out, anxious, depressed, or just overall exhausted. It could be because of friends, family, work, or overall life that makes you feel like you’re stuck. It is impacting your confidence, your self-esteem, and you might not know where it is coming from or what to do. It could be due to some past experiences that you’ve never fully addressed. Let’s talk, I’m here to help. 
## 1823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 672-3640
## 1824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Clinical Social Work/Therapist, PsyD, LCSW  
## 1826                                                                                                                                                                                                                                                                                                                                                                                                                          Let's face it- Whatever you are going through and whatever is bringing you to seek a therapist, it is probably not fun. Whether it is a break up, a divorce, a job loss etc. you have come to the right place. Seeking therapy and gaining self awareness is life changing and can help break old ugly habits. Whether it is a current life crisis or the desire to change old patterns, my style is nurturing, directive and fun. I work with you as a team getting to the core of the problem to help you move forward, and with a fresh perspective.
## 1827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 927-6816
## 1828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Marriage & Family Therapist, PsyD , LMFT, SEP  
## 1830                                                                                                                                                                                                                                                                                                                                                       I have been a psychotherapist for over 30 years in California.  I am the Past President of the Los Angeles Chapter of the California Association of Marriage and Family Therapists.  I am particularly interested in working with people who feel they've worked through a lot of their own personal issues and are interested in stepping out into life in a bigger way to make more of a difference in the world.  If that sounds interesting to you, give me a call.  Qualified people are invited to do a complimentary session with me to see if it makes sense for us to work together to realize your life goals.  
## 1831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 377-8190
## 1832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1834                                                                                                                                                                                                                                                                                                                                        We change what we acknowledge and accept. If you are seeking change, I provide a safe, supportive environment to build awareness, gain insight, and compassionately find acceptance of the factors blocking the change you seek. How? Therapy is both science and art. The science of therapy provides us with data that tells us which therapeutic strategies work best for specific problems. The art of therapy starts with the cumulative life experiences of the therapist--this is crucial in finding a good therapist and should not be discounted. A therapist should also be kind, empathic, humorous, direct, open, and honest.
## 1835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 638-2956
## 1836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, PsyD, LMFT  
## 1838                                                                                                                                                                                                                                                                                                                                                                                                                                                             I specialize in treating anxiety, depression, grief, trauma, and substance abuse. I have provided therapy in various settings: public mental health, family agencies, hospitals, school systems, and in private practice. I have worked with a wide range of severity of problems and challenges. These experiences provided me with ways to relate to my clients, regardless of circumstance or background, in a way where they can be heard and understood and provided a treatment that is meaningful to them.   
## 1839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 742-8456
## 1840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      I can imagine the strain that sheltering in place must be putting on your relationship. Working on your communication skills and intimate connection is challenging enough when you can go to your favorite yoga class when you need a break - but when you can’t leave the house - it can feel unbearable.
## 1843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 326-1340
## 1844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 1846                                                                                                                                                                                                                                                                                                                                       You may be experiencing an aching sense of sadness or fear because deep down inside, you feel that you aren’t good enough. You want to connect with others and engage fully in life but you second guess yourself at every turn. Maybe you learned to be critical of yourself from your parents; or, perhaps you never had space to be yourself because you had to take care of others, which left you feeling lost and unsure of yourself. If your problems are keeping you from living the life that you want, I can help. In therapy, we can work together to understand your issues so that you can gain a sense of clarity and peace.
## 1847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 238-1313
## 1848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1850                                                                                                                                                                                                                                                                                                                                                                                     I have a passion for seeing my clients have a transformational experience, evolving toward becoming more self realized persons. Let's talk about your difficulties, fears, or sadness. Let's understand your anxiety or anger. And let's do it in a warm and safe space where we will set judgment aside. We'll explore how you became who you are today, and perhaps along the way you'll discover a kinder view of yourself, capable of moving away from bitterness or anger, unleashing your creativity, and ultimately knowing yourself through your profound relationships with others.
## 1851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 332-5169
## 1852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist, PsyD, LMFT, 122560  
## 1854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            During these uncertain times in our lives, we have all had to face challenges. If you are experiencing depression and anxiety due to the stressors of everyday life, role transitions, relationship/family issues... I am here for you. I am here to provide you with coping strategies that will help you improve your mood while also giving you the space you need to share your thoughts and feelings to help you cope with life’s uncertainties.
## 1855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 510-1941
## 1856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Clinical Social Work/Therapist, MSW, LCSW, 85335  
## 1858                                                                                                                                                                                                                                                                                                                             I am an LCSW counselor licensed in California with over 10 years of experience working as a therapist and currently as a program manager. I have worked with clients with a wide range of concerns including depression, anxiety, relationship issues, parenting problems, grief and loss, PTSD and non traditional group/services (drumming, mindfulness groups, grief and loss groups, parenting group, adjustment/life changes groups. I also helped many people who have experienced physical/sexual abuse trauma or emotional abuse. Empowering individuals through finding their inner strengths to live a better quality of life is my forte.
## 1859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 361-1660
## 1860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Associate Professional Clinical Counselor, APCC, MA  
## 1862                                                                                                                                                                                                                                                                                                                         If you find yourself struggling with OCD, panic, anxiety, depression or experience difficulty regulating emotions, know that you can feel better with the right support. Emotions and anxiety can be debilitating and get in the way of enjoying life and being present in the moment.  I am registered in California as an Associate Professional Clinical Counselor (CA APCC 10970). I am currently employed by Aweh Support, LLC and I am supervised by Anim Aweh, Licensed Clinical Social Worker (86366). I have experience in both residential and PHP/IOP settings, including Rogers Behavioral Health. I use an ERP and DBT approach to therapy.
## 1863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 349-4578
## 1864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Pre-Licensed Professional, MSW  
## 1866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          I know that the decision to seek out therapy can be difficult and that finding a therapist is just as challenging.  That is why I provide clients with a down to earth style that allows them to feel comfortable right away.  Sessions are always tailored to meet the unique needs of each client and open communication is maintained throughout the course of therapy to assure their satisfaction.
## 1867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 353-4157
## 1868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Psychologist, PhD, LMFT, CST, TFT-VT, TFT  
## 1870                                                                                                                                                                                                                                                                                                                      My belief is that at heart each wants to lead a meaningful life.  We want to enjoy  achievements, milestones, and enjoy our loved ones. We also need to feel loved, needed and appreciated.  Our work, social and family life reflect our spiritual and philosophical beliefs...and when they don't, we feel in conflict with ourselves, and seek assistance to get into a place of feeling good. I'll work with you to support you in improving your life, with a beginning focus on those factors that are critical now. We'll work together for your well-being. The intake packet asks you to list the issues you want to address & indicate priority. 
## 1871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 895-9808
## 1872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, MA, LCSW  
## 1874                                                                                                                                                                                                                                                                                                                    I am a veteran therapist.  I have been in private practice for over thirty years and I  provide therapy to older adults, adults and children  Using warmth, sensitivity, patience, compassion, and wisdom I transform the therapy session into an environment where you  can explore, learn, and examine your strengths and weaknesses.  I am a gifted listener and problem-solver. You will feel safe with me to completely be yourself and know that I will be profoundly objective, kind, and confident in assisting you to ease your suffering and significantly increase  your self-love, wisdom, self-respect and ability to make changes in your life.
## 1875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 250-5370
## 1876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   You feel like you carry the weight of the world because you do. Too much work, or not enough. Relationship issues, or none at all. Interaction with family, blended and extended, parenting, you name it. Life is amazing, but at times it can be amazingly hard. Bring it all in. Let's unpack it and see how you can better manage the load.
## 1879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 218-0308
## 1880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist Associate, AMFT, APCC  
## 1882                                                                                                                                                                                                                                                                                                                                                                                                                                                     I am an Associate in both Marriage and Family Therapy and Professional Clinical Counseling. I have worked in both the university setting and in Intensive Outpatient Programs. I have a passion for individual therapy, couples, young adults, and working with those who are ready to start or continue their therapeutic journey. I hope for you to be able to share this part of your journey with me in a safe space, without judgement. I want you to be yourself with me as we dive deeper into your areas of concern.
## 1883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 496-3346
## 1884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1886                                                                                                                                                                                                                                                                                                                                        Your courage and resilience have gotten you this far and while seeking help is half the battle, I am here to guide you the rest of the journey. I work with clients to provide a safe space to address a variety of issues ranging from trauma, depression, anxiety, shame, grief, self-esteem and relationship difficulties and challenges. Together we can develop a new narrative about yourself and your potential while addressing past traumas and developing coping strategies to manage current and future challenges. I aim to assist clients overcome personal challenges, to create and maintain healthy and productive lives.
## 1887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 406-7442
## 1888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1890                                                                                                                                                                                                                                                                                                                   I am here to help you heal and grow by VIDEO/phone as an experienced Christian Licensed Marriage and Family Therapist. Need coping skills I can help. I work with individuals and couples.  Are you experiencing a loss from death, divorce, health issues, work or a relationship and need a safe place to process? Are you experiencing conflict and need help overcoming? I offer insight into issues and patterns that keep you from the life you want to have. I give you the tools to improve your communication skills with others, manage stress, grief, conflicts, depression and anxiety. I offer SPIRITUAL and EMOTIONAL support in a safe setting.
## 1891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 377-4537
## 1892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD, LP, LPCC, MSEd  
## 1894                                                                                                                                                                                                                                                                                                                           Making a change takes an act of courage. Congratulations on deciding that you want something different. Whether it's something different in your relationship(s), in the way that you engage with yourself, or in your behaviors, thoughts, or emotions, I am excited to work with you as you move forward the change that you want. I have committed to keeping up with evidence-based practice and constantly growing in multicultural humility to ensure that you can feel supported and valued and also can achieve the needed change to be your best self. I invite you to visit theoburnesphd.com to learn more about my professional expertise.
## 1895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 627-1499
## 1896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1898                                                                                                                                                                                                                                                                                                                       Many people are hurting in their day- to- day life. Sometimes the hurt is a personal one like depression, anxiety, poor self- esteem, grief and loss and other times it is a relational challenge within marriage, with children or teens and or with family or friends. Healing is possible though often times it is easy to loose sight of this or even be unsure of where to start.  I am here to help you take the first steps on your personal healing journey and guide you to navigate the process throughout. Don't let unspoken fears hold you back from getting help. You can thrive and not just survive but it all starts with the first step.
## 1899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 863-0621
## 1900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, PsyD, LMFT  
## 1902                                                                                                                                                                                                                                                                                                                                                                                                                                                             I specialize in treating anxiety, depression, grief, trauma, and substance abuse. I have provided therapy in various settings: public mental health, family agencies, hospitals, school systems, and in private practice. I have worked with a wide range of severity of problems and challenges. These experiences provided me with ways to relate to my clients, regardless of circumstance or background, in a way where they can be heard and understood and provided a treatment that is meaningful to them.   
## 1903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 742-8456
## 1904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       MD, PsyD  
## 1906                                                                                                                                                                                                                                                                                                                                                                                                                                    Your challenge may be aging, illness or chronic disease. Your job or your job satisfaction may be insufficient. Relationships and support from family and loved ones seem inadequate. Advice from friends and quick fix treatments are ineffective. You are not just a body, you are not just a mind. You are a complex individual who faces unique challenges. I can help you gain the strength and flexibility needed to surmount the challenges you face.  My goal is to help you uncover your true potential and lead a more joyful life.
## 1907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 242-1191
## 1908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, MFT  
## 1910                                                                                                                                                                                                                                                                                                  I'm a psychotherapist working with individuals, couples and families in the LA area and Sandpoint, Idaho.  I have 25 years\nexperience in one location and challenge the problems facing our complex and diverse society today.\n I believe in the Unity of Life. From the earliest single cell forms of life, to the complex human organism, there is a  basic energetic function that unites: Pain & Pleasure, \n Thinking & Emotion, Mind & Body, Man & Women, Family & Society.  When this unitary function is disrupted and blocked, healthy life suffers. Conflict and stress from this unitary disruption often results in \n irrationality, unhappiness and/or disease.
## 1911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 744-0840
## 1912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist, MA, LMFT, LPCC  
## 1914                                                                                                                                                                                                                                                                                                                                Strength  Hope  Resiliency   Positivity   Gratitude   Healing   These are key concepts that I highlight in my work as a Marriage and Family Therapist. I have been working over 15 years as a clinician with people from age 14 to 90 and their families. The issues brought to me most often include substance use disorder, depression, anxiety, personality disorders, trauma, grief and loss and difficulties in relationships. My approach is one of collaboration and a compassionate attitude toward the person to develop a good rapport and a mutual understanding of the goals for treatment. My techniques are tailored to the person 
## 1915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 354-8182
## 1916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Call me to schedule a free consultation to determine if we are a therapeutic match.\n\nMy practice includes working with individuals, families, and couples who are deal with relationship challenges, grief and loss issues, developmental stage challenges, and those who simply need help dealing with past life events. \n\nMy aim is to help empower individuals to be self efficient.
## 1919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 963-9022
## 1920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Psychologist, PhD, MA, PCC  
## 1922                                                                                                                                                                                                                                                                                                                 It is an honor to meet you. I am CEO/lead psychologist at Empowerment Psychology. I am a dynamic, intuitive and committed psychologist who believes that personal healing and social transformation go hand-in-hand. I value those qualities that make you human, while recognizing those issues that impact your vitality, passion, purpose and ability to live fully inside of your life, with your loved ones, at work, in society. I create a safe and inviting space for you to share who you are and develop an authentic rapport with me based on trust and non-judgement. As a result, I can better walk with you in your journey of growth and healing.
## 1923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 845-6943
## 1924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 1926                                                                                                                                                                                                                                                                                                                                                                                         My approach to therapy focuses on establishing a warm, trusting relationship with my clients to help us explore deep personal issues.  My areas of focus include depression, anxiety, trauma, addictive behaviors, co-dependency, and life transitions. In my approach I use psycho-dynamic and solution-focused approaches to help dislodge old behavioral patterns and emphasize the importance of how our previous relationships impact our present. In therapy we will look to find meaning in our present-day challenges, experiment with new ways of thinking and seek resolution.
## 1927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 210-0269
## 1928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, MA, LCSW  
## 1930                                                                                                                                                                                                                                                                                                                    I am a veteran therapist.  I have been in private practice for over thirty years and I  provide therapy to older adults, adults and children  Using warmth, sensitivity, patience, compassion, and wisdom I transform the therapy session into an environment where you  can explore, learn, and examine your strengths and weaknesses.  I am a gifted listener and problem-solver. You will feel safe with me to completely be yourself and know that I will be profoundly objective, kind, and confident in assisting you to ease your suffering and significantly increase  your self-love, wisdom, self-respect and ability to make changes in your life.
## 1931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 250-5370
## 1932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Marriage & Family Therapist, PsyD , LMFT, SEP  
## 1934                                                                                                                                                                                                                                                                                                                                                       I have been a psychotherapist for over 30 years in California.  I am the Past President of the Los Angeles Chapter of the California Association of Marriage and Family Therapists.  I am particularly interested in working with people who feel they've worked through a lot of their own personal issues and are interested in stepping out into life in a bigger way to make more of a difference in the world.  If that sounds interesting to you, give me a call.  Qualified people are invited to do a complimentary session with me to see if it makes sense for us to work together to realize your life goals.  
## 1935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 377-8190
## 1936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 1938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   More people struggle with anxiety and depression than would like to admit it. It can also feel very isolating and hopeless at times. Whether you are a teen or adult, it can be important to talk to someone who can help with processing your experiences. If you are motivated for change and looking for someone to keep you accountable, you have come to the right place.
## 1939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (951) 433-7892
## 1940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, LCSW, CSAT, CST, SEP, CGP  
## 1942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Are you having problems communicating with your partner? Are you struggling with letting go of bad habits? Are you finding it difficult to stay in the moment when you are being intimate with your partner?  I have dedicated my career to helping people live the lives they want to live, and change their life to get closer to their partners. 
## 1943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 895-9604
## 1944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 1946                                                                                                                                                                                                                                                                                                                                                                                                                                    Do you find that you have difficulty trusting others and it's started to affect your relationships? Have you been isolating more and struggle to find motivation and interest in your normal activities? Perhaps your mood has changed or you feel more fearful and worried. These experiences can have a huge impact on your daily life and are incredibly hard to manage on your own. If this is the case for you and you are ready for change, I can offer specific tools and strategies to help you work towards what's important to you.
## 1947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 577-1228
## 1948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, LCSW, MSW  
## 1950                                                                                                                                                                                                                                                                                                                                              I provide therapy services to individuals, couples, and families who are looking for relief, for insight, and for growth and change. My areas of speciality include trauma, depression, anxiety, and relational issues. I may be the right fit for you if you are suffering from the effects of past trauma, if you had a difficult relationship with a parent or caregiver, if your relationships are filled with uncertainty, if you are looking for a more solid sense of identity and meaning in your life. My therapeutic approach is based on an understanding of trauma, attachment, social justice, and client empowerment.
## 1951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 283-9870
## 1952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Psychologist, PhD, CAS  
## 1954                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Are you wondering… Why your child doesn’t talk much or seems to be quiet all the time? Why your child likes to be alone or has a hard time with friendships? Why your child does the same thing over and over again? Why your child insists on sticking to routines? If you have considered these questions, I have answers. As a Certified Autism Specialist (CAS), I have specific expertise in evaluation of neurodevelopmental disorders including Autism Spectrum Disorders (ASD) and Disabilities (ID). 
## 1955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 825-6273
## 1956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 1958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Unfortunately, I am no longer accepting new patients at this time.
## 1959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 378-4819
## 1960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       PhD, MSW  
## 1962                                                                                                                                                                                                                                                                                                                Due to a unique combination of both professional and personal experience in adoption and infertility, who better to guide you through your transition, adoption journey or adoptive parenting. If you have experienced infertility/secondary infertility, and are considering growing or expanding your family through adoption and don't know where to start, then I can help. If you are already a prospective adoptive parent, I can provide educational and supportive services, including monthly support groups. If you are an adoptive parent needing support with an open adoption relationship or talking to your child about adoption, I can also help.
## 1963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (855) 530-2758
## 1964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           My focus is to support individuals heal, energize, and become aware of their inner strengths. By centering the mind-body-being connection, I have a holistic approach with my clients to help create an individualized treatment plan that works best for them. I am dedicated to providing a space that is warm, compassionate and accessible, where you feel safe to explore the ways in which you can build a more fulfilling life.
## 1967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (510) 272-7366
## 1968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   You feel like you carry the weight of the world because you do. Too much work, or not enough. Relationship issues, or none at all. Interaction with family, blended and extended, parenting, you name it. Life is amazing, but at times it can be amazingly hard. Bring it all in. Let's unpack it and see how you can better manage the load.
## 1971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 218-0308
## 1972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 1974                                                                                                                                                                                                                                                                                                 I am a Licensed Marriage and Family Therapist eager to collaborate with other mental health professionals to provide comprehensive and holistic treatment to clients struggling with pervasive disorders. I have extensive experience working with adults and Transitional Age Youth. I currently work with children in the age group 0-15 with their families. I have demonstrated skills in creating and implementing effective and individualized treatment plans and over 6 years of experience with Department of Mental Health standards and paperwork. In addition, I have foundational coursework and training in Cognitive-Behavioral and Dialectical Behavior Therapy.
## 1975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 945-2227
## 1976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 1978                                                                                                                                                                                                                                                                                  I am a licensed psychologist primarily serving adults and adolescents who struggle with depression and anxiety; borderline personality disorder; substance and alcohol use; relationship distress; emptiness; intolerable emotions; impulsive behaviors including suicidal and self-injurious behavior; eating concerns; and histories of trauma. My therapeutic approach centers on utilizing Dialectical Behavior Therapy (DBT). DBT was initially developed to treat borderline personality disorder but is now used to effectively treat a broad spectrum of psychological problems by focusing on enhancing the skills necessary to not only cope but thrive in a world full of obstacles.
## 1979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 488-0922
## 1980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 1982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       My academic and postgraduate training is based on the Scientist-Practitioner Model. I practice a collaborative, client-centered, strengths-based, and recovery-oriented approach to psychotherapy. As a therapist, I am a sex-positive LGBTQ-affirming provider who utilizes a transparent, direct, culturally sensitive, non-judgmental, warm, validating, accepting, and supportive interpersonal style.
## 1983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 768-0732
## 1984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW, EMDR, SEP, RYT  
## 1986                If you've become lost amongst obstacles on your journey, I'd like to help guide you to more happiness by offering suggestions, uncovering unwanted patterns, and leading you from the past to the present in order to heal and evolve, enhancing your happiness.  Through changes in perceptions/attitudes and being willing to see situations with a new pair of glasses, you can reach your goals and evolve.  My clients report that they enjoy my down-to-earth attitude and humor and my use of Somatic Experiencing, EMDR, TRM, meditation and yoga to treat mind-body symptoms.  I work best with clients who are motivated to gain self-awareness and see patterns that are no longer serving them.  I give homework between sessions in order to keep the continuity of healing working consistently.  I feel very blessed to be working in a field that serves people who are finding their best selves and evolving into the people they want to be.  
## 1987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 905-2256
## 1988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Clinical Social Work/Therapist, MSW, LCSW, 85335  
## 1990                                                                                                                                                                                                                                                                                                                             I am an LCSW counselor licensed in California with over 10 years of experience working as a therapist and currently as a program manager. I have worked with clients with a wide range of concerns including depression, anxiety, relationship issues, parenting problems, grief and loss, PTSD and non traditional group/services (drumming, mindfulness groups, grief and loss groups, parenting group, adjustment/life changes groups. I also helped many people who have experienced physical/sexual abuse trauma or emotional abuse. Empowering individuals through finding their inner strengths to live a better quality of life is my forte.
## 1991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 361-1660
## 1992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist Associate, AMFT  
## 1994                                                                                                                                                                                                                                                                                                                                                   Are anxiety and stress keeping you from living your life to your fullest potential? Are you feeling stress weighing on you internally or causing you to feel exhausted and hopeless? Together we will explore ways to grow, further develop self-acceptance and unearth traumatic experiences and daily stressors that are hindering you from achieving this potential. I will be available to provide an unbiased listening ear and warm spirit as you reimagine the life you want for yourself. In this safe and accepting environment, we will develop an action plan to better manage your unique symptoms and your life. 
## 1995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 293-4791
## 1996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 1997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Associate Clinical Social Worker, MA, ACSW  
## 1998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Do you feel disoriented by life? Are you experiencing a state of overwhelm? Are you or a family member experiencing issues related to incarceration or deportation?  Are you currently grappling with issues surrounding your professional and personal growth?  Do you identify as system-impacted? I have 20 years of experience working with individuals who have been incarcerated, individuals who identify as LGBTQIA, and their immediate communities (family members, partners, parents).
## 1999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 968-5075
## 2000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2002                                                                                                                                                                                                                                                                                                                                                                                                                                                                 I treat clients from a trauma informed perspective. If it is addiction issues (substance or process) anxiety, depression or other mood disorders, so much of what informs these maladies is developmental or relational trauma. Big T or shock trauma can bring on many underlying issues that have been dormant. I work with clients to carefully assess their history and treatment goals. I use CBT, Psychodynamics, EMDR and other trauma treatment modalities to effectively resolve the inner disturbance.
## 2003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 299-2361
## 2004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Psychologist, PhD, MA, MSc  
## 2006                                                                                                                                                                                                                                                                                                                          I am a licensed clinical psychologist with years of experience working with individuals, couples, and families who may be struggling with difficulties related to the intersection between physical and mental health.  I specialize in evidence-based treatment and have extensive training in Cognitive Behavioral Therapy, Acceptance and Commitment Therapy and mindfulness-based approaches. I see therapy as a way to utilize these evidence-based treatments to explore whatever may be keeping you stuck in the habits, patterns, or situations that may no longer be serving you and learning skills to help you overcome these circumstances.
## 2007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 408-1641
## 2008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2010                                                                                                                                                                                                                                                                                                                                                                                             It is not uncommon for many of us to cling to belief systems that ultimately do not serve us. We bend over backwards to put out a facade of confidence, dependability, and accomplishment to the outside world in an attempt to live up to society’s and our own unattainable standards. We give and give to our jobs, our families, and our community to the point of utter exhaustion. Despite all the hard work we put forth, on the inside, we often feel deeply unfulfilled and empty. This often leads to exhaustion, loneliness, and emotional pain that just won’t go away. 
## 2011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 401-2378
## 2012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Associate Clinical Social Worker, A, S, W  
## 2014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   I work well with, young adults, adults and couples dealing with heavy emotions, confusion, or ADHD. If you are battling a lack of connection, motivation, sadness, negative thinking, racing thoughts, anxiety, or depression 
## 2015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 340-5859
## 2016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 2018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Unfortunately, I am no longer accepting new patients at this time.
## 2019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 378-4819
## 2020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Hello beautiful people. My most treasured skill as a therapist but most importantly as a human is the ability to connect and relate with almost any one no matter your race, gender, culture, sexual orientation, socioeconomic status, or age. I am learning in practice and in life that no matter how old, young, accomplished or established we become there will always be a natural human yearning we carry to feel like we belong and that we matter to others.
## 2023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 364-1104
## 2024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Marriage & Family Therapist, PhD, MFT, MA  
## 2026                                                                                                                                                                                                                                                                                                                 Many clients come to me depressed, grief stricken, or at a loss for where to proceed in their lives. Faulty thinking can block the ability to realize new options for thoughts and behaviors. Training, wisdom, and life experiences allow me to help guide my clients to their best therapeutic path, to personalize treatment, and to help them find their purpose. I work with trauma survivors, people with disabilities, life transitions, crises, hospice care, death, and chronic anxiety. I'm also trained to support artists through their creative struggles.  That process provides them the foundation to strengthen them for any future challenges.
## 2027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 621-3513
## 2028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2030                                                                                                                                                                                                                                                                                                                                        We change what we acknowledge and accept. If you are seeking change, I provide a safe, supportive environment to build awareness, gain insight, and compassionately find acceptance of the factors blocking the change you seek. How? Therapy is both science and art. The science of therapy provides us with data that tells us which therapeutic strategies work best for specific problems. The art of therapy starts with the cumulative life experiences of the therapist--this is crucial in finding a good therapist and should not be discounted. A therapist should also be kind, empathic, humorous, direct, open, and honest.
## 2031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 638-2956
## 2032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   You feel like you carry the weight of the world because you do. Too much work, or not enough. Relationship issues, or none at all. Interaction with family, blended and extended, parenting, you name it. Life is amazing, but at times it can be amazingly hard. Bring it all in. Let's unpack it and see how you can better manage the load.
## 2035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 218-0308
## 2036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Clinical Social Work/Therapist, PsyD, LCSW  
## 2038                                                                                                                                                                                                                                                                                                                                                                                                                          Let's face it- Whatever you are going through and whatever is bringing you to seek a therapist, it is probably not fun. Whether it is a break up, a divorce, a job loss etc. you have come to the right place. Seeking therapy and gaining self awareness is life changing and can help break old ugly habits. Whether it is a current life crisis or the desire to change old patterns, my style is nurturing, directive and fun. I work with you as a team getting to the core of the problem to help you move forward, and with a fresh perspective.
## 2039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 927-6816
## 2040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, PsyD, LMFT  
## 2042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     You want to overcome addiction, substance use disorder, relationship or family issues but don't know how or where to begin. 
## 2043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 693-8521
## 2044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2046                                                                                                                                                                                                                                                                                                                                                                                                                     Welcome! In my almost 10 years of clinical practice I have worked with diverse populations in the outpatient, inpatient, community and private practice setting. I work to build a trusting, safe, empathic therapeutic relationship to assist you in meeting your treatment goals. My experience has been focused on helping clients with issues pertaining to anxiety, depression, major life changes, and stress management. Together we can work on building the skills, processing the past and developing coping mechanisms to help you in the future.
## 2047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 496-0048
## 2048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Marriage & Family Therapist, MA, LMFT, CST-C  
## 2050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Is it difficult to trust others or your partner? Do you find yourself avoiding people or lacking energy to do the things you enjoy? Would you like a better relationship with yourself and others? I am cisgender LGBTQ affirmative therapist, my goal is to provide a sex positive environment for you to be authentically who you are, without judgment. During short term treatment I will provide you with tools to find practical solutions to your challenges. 
## 2051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (951) 692-4360
## 2052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2054                                                                                                                                                                                                                                                                                                                     Therapy is a place for building confidence, motivation and belonging. In order to help you, we must engage the amazing complexity of you at the multiple levels of your life. No level is privileged. A person is always more than their thoughts and behaviors. A person is always more than their history. Not only do I work to “change” thoughts and behaviors, I work with the whole person-in-their-experiential-context. A good therapist doesn’t just “do therapy”. They sense and do justice to the person in their context. I am a radically different therapist with each person I see. This is because I believe that you are the expert on you.
## 2055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 404-6934
## 2056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2058                                                                                                                                                                                                                                                                                                                                                                                                                                                        To request an appointment please visit foresightmentalhealth.com - I am a client-centered therapist that focuses on addressing both negative and positive thought patterns and behaviors. I am very much focused on what people are saying as well as what they are not saying. I always verify that my interpretations or understanding of what patients are communicating is accurate. I believe very strongly they building a truth based in a trusting relationship is a key to a patient being able to make changes.
## 2059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 581-1244
## 2060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist Associate, AMFT  
## 2062                                                                                                                                                                                                                                                                                                                                                                                                                Together, we will build an authentic, trusting connection where it is safe to unmask the parts of ourselves we normally hide. When someone seeks therapy, they are looking to feel seen, understood, and heard. Through our relationship, we will nurture the parts of ourselves that feel neglected.  The relationship we have with ourselves is the foundation for all other aspects of our lives. My work focuses on nurturing that relationship to deepen fulfillment, practice self alignment, and feel more intimately connected with ourselves and others.
## 2063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 886-0480
## 2064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist, PsyD, LMFT, 122560  
## 2066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            During these uncertain times in our lives, we have all had to face challenges. If you are experiencing depression and anxiety due to the stressors of everyday life, role transitions, relationship/family issues... I am here for you. I am here to provide you with coping strategies that will help you improve your mood while also giving you the space you need to share your thoughts and feelings to help you cope with life’s uncertainties.
## 2067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 510-1941
## 2068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Relationship stress, conflict, and anxiety can rob the joy of dating and being in love.  The pain of not fully connecting, cheating, and addiction issues with a loved one can feel unstabilizing. 
## 2071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 621-3501
## 2072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, PsyD, LMFT  
## 2074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          You want to live a life worth living. You want to connect with others in ways that work and stop attracting the same dysfunctional relationships. You want to be confident in your decision-making and have control over your actions and emotions. Pain often indicates the need for our loving attention to certain aspects of our inner life which need tending too.
## 2075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 267-6645
## 2076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Psychologist, PhD, LP, MA  
## 2078                                                                                                                                                                                                                                                                                                                               You have already taken an enormous step towards your healing by beginning to look for a therapist, so first take a moment to express gratitude for yourself.  You want to feel at ease, liberated, seen, understood, connected to others, and comfortable taking up space. I can help! As a 2-SQT/LGBTQ+ Affirming, Anti-Racist, Trauma-Informed, Intersectional, and Liberation-Based therapist, I acknowledge that systemic harm, like white supremacy, generational trauma, and the violence and abuse that is perpetuated by trauma and oppression can have deep, lasting scars that  that impact our relationships with ourselves and others.
## 2079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 928-9576
## 2080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, LMFT, PsyD  
## 2082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                The nature of my work as a psychotherapist is to strive for a safe and trusting environment during the time that is shared. Together we build the relationship as patient and therapist with the goal of providing a comfortable and private space for us to discuss any challenging issues they are experiencing, decreasing limits and without judgment. My orientation of choice is the psychodynamic orientation and I mainly focus from the psychoanalytic relational space.
## 2083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 543-3077
## 2084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Marriage & Family Therapist, LMFT, PMH-C  
## 2086                                                                                                                                                                                                                                                                                                                   Adulting is already hard enough; throw in infertility, postpartum depression/anxiety, pregnancy following loss (heIlo, anxiety!), loss/grief/bereavement, trauma, relationship/communication issues, boundaries and family conflict and now you've got discomfort, unpleasant feelings, disconnection and stress. While we may not be able to change all of the obstacles in your life, we can certainly work collaboratively to adjust expectations, reinforce coping skills, strengthen resilience, improve communication skills, set boundaries, process trauma and elicit clarity and direction.    (This is a small, boutique group Telehealth practice).
## 2087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 366-4404
## 2088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             It is difficult to ask for help and even more difficult to chose a psychologist. This is especially true if you are in crisis, having difficulty coping, worried about a loved one or struggling with a low mood or anxiety. I've had 40 years of experience working with people. It is an adventure getting to know a new client and rewarding to watch them become happier, more effective and improve their life.
## 2091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 475-1286
## 2092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2094                                                                                                                                                                                                                                                                                                                                                                                             It is not uncommon for many of us to cling to belief systems that ultimately do not serve us. We bend over backwards to put out a facade of confidence, dependability, and accomplishment to the outside world in an attempt to live up to society’s and our own unattainable standards. We give and give to our jobs, our families, and our community to the point of utter exhaustion. Despite all the hard work we put forth, on the inside, we often feel deeply unfulfilled and empty. This often leads to exhaustion, loneliness, and emotional pain that just won’t go away. 
## 2095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 401-2378
## 2096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Psychologist, PhD, QME  
## 2098                                                                                                                                                                                                                                                                                                                                     I have focused on helping individuals overcome stressful life situation for my entire career. Through direct service as well as training promising doctoral clinical psychology students, I have used techniques which are effective in providing the most help to clients in the shortest possible time.  Some of the clients of particular emphasis have been students, and faculty and staff of colleges and universities. In addition, I have helped public employees and first responders cope with job related problems. I have also spent many years working with individuals and families of those with developmental disabilities. 
## 2099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (747) 204-3428
## 2100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 2102                                                                                                                                                                                                                                                                                                                                                           Everyone deserves a safe space to process and grow and I believe that safety can be in the therapy room. My clients describe me as calm, supportive, patient, and non-judgmental of their views, lifestyles, and aspirations. I love working with adults who are struggling with anxiety, relationship issues, depression, or life transitions and couples who are interested in deepening their relationship or getting through difficult phases. Social justice, intersectionalism, and anti-oppression values deeply inform my therapy work. I approach all client relationships from a place of cultural humility.
## 2103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (909) 345-5803
## 2104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, MA, LCSW  
## 2106                                                                                                                                                                                                                                                                                                                    I am a veteran therapist.  I have been in private practice for over thirty years and I  provide therapy to older adults, adults and children  Using warmth, sensitivity, patience, compassion, and wisdom I transform the therapy session into an environment where you  can explore, learn, and examine your strengths and weaknesses.  I am a gifted listener and problem-solver. You will feel safe with me to completely be yourself and know that I will be profoundly objective, kind, and confident in assisting you to ease your suffering and significantly increase  your self-love, wisdom, self-respect and ability to make changes in your life.
## 2107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 250-5370
## 2108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 2110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               As a licensed psychologist, my clinical experience is with individuals, children, adolescents, and families dealing with stressful and agonizing life events.   In addition, my professional expertise also includes providing psychological testing and evaluations, psycho-educational assessments, and immigration evaluations.
## 2111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 294-8902
## 2112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2114                                                                                                                                                                                                                                                                                                                                                                                                                         OFFERING VIDEO SESSIONS DURING COVID-19...……………… I take a creative approach, tailoring treatment to each individual, couple and family I see.  I utilize a variety of modalities Family Systems, Cognitive Behavioral and Solution Focused Therapy to help gain insight into past and present experiences and behaviors, identify and build strengths, develop healthy coping strategies and challenge long held assumptions about yourself, your relationships and the world you live in.  I have extensive knowledge working with diverse populations.
## 2115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 293-1626
## 2116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2118 "What's madness but nobility of soul at odds with circumstance (Roethke, 1961)."                                                                                                                                                                                                                                                                                                                                                                                            It is likely that you will come to see me because you are suffering.  I will help you understand the sources of your pain.  Together we will discover how past coping behavior, although understandable and partially sustaining given the challenges of your life, may become limiting and a source of dysfunction. In a safe and professional relationship, I will assist you to change old rigid ways of thinking and behaving to embrace new flexible and balanced responding to foster success.
## 2119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 618-7145
## 2120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2122                                                                                                                                                                                                                                                                                                                                                                                                                                      Welcome! I am a licensed psychotherapist in Playa Vista, Ca, and I specialize in working with millennials, professionals, parents, and couples. We can work together on resolving relationship conflicts, coping with feelings of being overwhelmed at work and home, breaking free from unproductive patterns, overcoming parenting challenges, and finding more joy and purpose in life. When you join me in therapy, we will develop a therapy plan, that will introduce you to new strategies, targeted at meeting your specific goals.
## 2123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 736-5199
## 2124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, PhD  
## 2126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Hello Reader.......If you are experiencing issues with relationship changes, loss, transition/stress, anxiety, continuing sadness and lack of energy, I would like to work with you to understand, clarify, and begin a change process to provide a way out of feeling "stuck" and helpless.  I look forward to talking with you to address your needs and concerns. Our goal?  Build your strengths and confidence to get your self moving in the directions of satisfaction and security.
## 2127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 878-2574
## 2128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2130                                                                                                                                                                                                                                                                                                                                        First off, congrats on taking this first step toward your mental health journey! Whether you're struggling with anxiety, depression, unresolved childhood trauma, relationship issues or grief, I'm here to help. I work with clients to improve communication styles, set healthy boundaries and increase emotional regulation through mindfulness and grounding techniques. I'm here to assist my clients in navigating life's uncertainty, while promoting insight and self-awareness. My hope is that through this collaboration, you gain a new sense of empowerment, well-being and healing that allows you to live your best life!
## 2131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 797-5365
## 2132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Clinical Social Work/Therapist  
## 2134                                                                                                                                                                                                                                                                                                                                                                                                                                   Hey there!  Welcome, and congratulations on making your first step to taking back control of your life! You are so brave and courageous to be starting this path of exploring the benefits of therapy. The reality is, life is a journey, and we all need help sometimes. We can get stuck, become overwhelmed, or hopeless with everything that life throws at us. My name is Rochelle, I am a Licensed Clinical Social Worker (LCSW), and I am here to support you with the process of getting back on track. Please feel free to reach out.
## 2135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 268-5485
## 2136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Psychologist, PhD, SEP  
## 2138                                                                                                                                                                                                                                                                                                                                                            Thank you for taking time to read about my work. I am a clinical psychologist (PhD, UCLA, 1991) and have been providing psychotherapy to individuals and couples for over twenty five years. My approach integrates insight oriented/depth psychotherapy with mindfulness/meditation within a framework of body awareness. A central part of therapy is the mutually created caring and healing relationship. If we work together, time will be devoted to building a trusting, safe and containing relationship where early (developmental) as well as more recent challenges can be discussed, explored and healed.
## 2139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 322-1664
## 2140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       PhD, CMT  
## 2142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    If you need support during challenging times and states, or if you are going through difficulties around health, emotional, spiritual and psychological difficulties or past traumas, especially if you are feeling overwhelmed due to all that is going on in the world, Dr. Ellie can help.
## 2143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 342-7160
## 2144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, LMFT, PsyD, Life, Coach  
## 2146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Dr. Wendy M. O'Connor is a licensed Marriage and Family Therapist as well as holds a doctorate in psychology and is in private practice in Brentwood & Encino California. She has worked in various settings with over seventeen years of experience in the community.  Dr. Wendy O'Connor & Associates specialize in single adults, couples & teens.
## 2147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 906-4422
## 2148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Relationship stress, conflict, and anxiety can rob the joy of dating and being in love.  The pain of not fully connecting, cheating, and addiction issues with a loved one can feel unstabilizing. 
## 2151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 621-3501
## 2152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2154                                                                                                                                                                                                                                                                                                                                                             CONFIDENTIAL ONLINE APPOINTMENTS VIA VIDEO AVAILABLE!  I am able to help people looking to move past a barrier that seems insurmountable; whether it be feelings, like grief, depression or anxiety, circumstances, like a stalled career or sudden loss of a job or relationship, or simply feeling unseen or unheard by those around them.  Micro-aggressions based on race, gender or sexual orientation that no one else seems to get can be expressed and processed in our work.  Dreams, waking and actual, can be explored and a need to discover and embrace your identity, in all of it's forms can be met.
## 2155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 221-6123
## 2156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2158                                                                                                                                                                                                                                                                                                                                                                  My role as your therapist is to walk alongside you on your journey of growth and help you discover your inner strengths and power to live a fulfilling life. I provide a safe place for clients to express their experiences, thoughts, and feelings and treat everyone with respect, compassion, and a culturally competent perspective. I have specialized training utilizing evidence-based practices that were developed to ensure strength-based, research-backed interventions and treatment. These include but are not limited to CBT, IPT, Seeking Safety, Brain Spotting, TF-CBT (Trauma-Focused CBT).
## 2159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 683-5712
## 2160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Psychologist, MA, PsyD  
## 2162                                                                                                                                                                                                                                                                                                                               I help clients come to terms with their past, heal, grow, get unstuck, and move forward. You may be feeling stressed, overwhelmed, lonely, hopeless, lost, or just "stuck." Still, I know that you can overcome your struggles and begin to live your best life. I help women of all ages and life stages rise up to meet life's many challenges. I help clients overcome their struggles with anxiety, depression, chronic stress, feelings of overwhelm, relationship issues, work challenges, and difficulties staying focused and making important decisions. I'm an active, engaging therapist with a supportive and collaborative approach. 
## 2163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 341-5210
## 2164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 2166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Your problems are important to you, no matter how small the world or others view them.   Don’t be afraid to seek help if the problem is a struggle to YOU.  Your strengths, local knowledge, and culture are all focal points of your sessions. I believe that my clients are the experts of their own lives and that these elements will help you to initiate change. 
## 2167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 827-7605
## 2168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Clinical Social Work/Therapist, LCSW, MFA, MA  
## 2170                                                                                                                                                                                                                                                                                                                         I am glad you're looking for therapeutic support in times that are drastically impacted by the capitalistic mindset and inequality. Life’s external factors, stress and trauma experiences including but not limited to childhood abuse, physical abuse, intimate partner violence, sexual violence, racial and social traumas as well as anti LGBTQ+ policies are taking toll on our bodies. These show up as fatigue, sadness, anxiety, overthinking, thoughts of self-harm, and disables us from our lives. In such times we all can use a trauma-informed and nonjudgmental professional support to help us heal from root causes of these symptoms.
## 2171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 384-9257
## 2172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Psychologist, PhD, LMFT, CST, TFT-VT, TFT  
## 2174                                                                                                                                                                                                                                                                                                                      My belief is that at heart each wants to lead a meaningful life.  We want to enjoy  achievements, milestones, and enjoy our loved ones. We also need to feel loved, needed and appreciated.  Our work, social and family life reflect our spiritual and philosophical beliefs...and when they don't, we feel in conflict with ourselves, and seek assistance to get into a place of feeling good. I'll work with you to support you in improving your life, with a beginning focus on those factors that are critical now. We'll work together for your well-being. The intake packet asks you to list the issues you want to address & indicate priority. 
## 2175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 895-9808
## 2176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, AMFT  
## 2178                                                                                                                                                                                                                                                                                                                                                                             I believe in the healing power of trust in any therapeutic relationship. My experience working with individuals struggling with anxiety, depression, substance abuse, domestic violence and couples and relationship issues has helped mold mold me into being an open-minded, empathic, and non-judgmental therapist. I received my Master’s in Counseling Psychology from Pacifica Graduate Institute, where I studied Jungian psychology. I have come to learn that true, sustainable change comes not out of fear, but out of the desire to meet your potential as a fully realized human being.
## 2179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 984-7958
## 2180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2182                                                                                                                                                                                                                                                                                                                     Therapy is a place for building confidence, motivation and belonging. In order to help you, we must engage the amazing complexity of you at the multiple levels of your life. No level is privileged. A person is always more than their thoughts and behaviors. A person is always more than their history. Not only do I work to “change” thoughts and behaviors, I work with the whole person-in-their-experiential-context. A good therapist doesn’t just “do therapy”. They sense and do justice to the person in their context. I am a radically different therapist with each person I see. This is because I believe that you are the expert on you.
## 2183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 404-6934
## 2184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist, MA, LMFT, LPCC  
## 2186                                                                                                                                                                                                                                                                                                                                Strength  Hope  Resiliency   Positivity   Gratitude   Healing   These are key concepts that I highlight in my work as a Marriage and Family Therapist. I have been working over 15 years as a clinician with people from age 14 to 90 and their families. The issues brought to me most often include substance use disorder, depression, anxiety, personality disorders, trauma, grief and loss and difficulties in relationships. My approach is one of collaboration and a compassionate attitude toward the person to develop a good rapport and a mutual understanding of the goals for treatment. My techniques are tailored to the person 
## 2187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 354-8182
## 2188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist Associate, AMFT  
## 2190                                                                                                                                                                                                                                                                                                                                                   Are anxiety and stress keeping you from living your life to your fullest potential? Are you feeling stress weighing on you internally or causing you to feel exhausted and hopeless? Together we will explore ways to grow, further develop self-acceptance and unearth traumatic experiences and daily stressors that are hindering you from achieving this potential. I will be available to provide an unbiased listening ear and warm spirit as you reimagine the life you want for yourself. In this safe and accepting environment, we will develop an action plan to better manage your unique symptoms and your life. 
## 2191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 293-4791
## 2192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, PsyD, LMFT  
## 2194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  It isn't easy to make a first appointment with a therapist. Most people think about it for a long time, then think about it some more. But when there's too much fighting, too little energy, too much worry, or loneliness, or disappointment, or just a feeling that something isn't right, it can be a big relief to take that step and do something about it. Therapy can help you to feel better, to be more productive, and to have better relationships.
## 2195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 895-9845
## 2196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD, LP, LPCC, MSEd  
## 2198                                                                                                                                                                                                                                                                                                                           Making a change takes an act of courage. Congratulations on deciding that you want something different. Whether it's something different in your relationship(s), in the way that you engage with yourself, or in your behaviors, thoughts, or emotions, I am excited to work with you as you move forward the change that you want. I have committed to keeping up with evidence-based practice and constantly growing in multicultural humility to ensure that you can feel supported and valued and also can achieve the needed change to be your best self. I invite you to visit theoburnesphd.com to learn more about my professional expertise.
## 2199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 627-1499
## 2200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Licensed Psychoanalyst, PhD, ATCB  
## 2202                                                                                                                                                                                                                                                                                                                                                                                                                                                               I have worked in the field of psychotherapy/psychoanalysis for over 25 years. As a result of my extensive training in various types of therapies, I am able to tailor my approach to each individual in order to solve problems and alleviate symptoms efficiently and for the long term. I have particular expertise with clients who work in creative fields like film, music, fashion and visual art. I specialize in talk / art therapy working with adults, teenagers, children with cancer and chronic pain.
## 2203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 990-7244
## 2204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2206                                                                                                                                                                                                                                                                                                                                                                                             It is not uncommon for many of us to cling to belief systems that ultimately do not serve us. We bend over backwards to put out a facade of confidence, dependability, and accomplishment to the outside world in an attempt to live up to society’s and our own unattainable standards. We give and give to our jobs, our families, and our community to the point of utter exhaustion. Despite all the hard work we put forth, on the inside, we often feel deeply unfulfilled and empty. This often leads to exhaustion, loneliness, and emotional pain that just won’t go away. 
## 2207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 401-2378
## 2208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2210                                                                                                                                                                                                                                                                                                                                                                      I really enjoy working with first timers to therapy, as much as I enjoy people who've seen many therapists. I often work with artists, professionals (entertainment, corporate, attorneys, etc), caregivers, entrepreneurs, other healthcare professionals and people from all walks of life. Sometimes they seek self compassion, with a desire to know self love, others want to know themselves on a deeper level, and most are looking to heal from trauma and adversity. Whatever the reason, we focus on shedding light on strengths, pain, wellness, and connecting with one's true, authentic self.
## 2211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 963-4937
## 2212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2214                                                                                                                                                                                                                                                                                                                                                                                                                  Healing emotional wounds, whether due to low sense of self-worth, loss of a loved one, life transitions, or childhood trauma, can seem like a scary process. Often, depressed mood, anxious distress, irritability and grief can begin to manifest themselves physically in the form of muscle tension, headaches, nausea, and rapid heart beat. And, no matter how much one tries to "get over it" and think positive, those negative and worrying thoughts continue to creep in, impairing sleep, one's social life and ability to complete day-to-day tasks.
## 2215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 409-4916
## 2216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2218                                                                                                                                                                                                                                                                                                                                        We change what we acknowledge and accept. If you are seeking change, I provide a safe, supportive environment to build awareness, gain insight, and compassionately find acceptance of the factors blocking the change you seek. How? Therapy is both science and art. The science of therapy provides us with data that tells us which therapeutic strategies work best for specific problems. The art of therapy starts with the cumulative life experiences of the therapist--this is crucial in finding a good therapist and should not be discounted. A therapist should also be kind, empathic, humorous, direct, open, and honest.
## 2219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 638-2956
## 2220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2222                                                                                                                                                                                                                                                                                                                                        First off, congrats on taking this first step toward your mental health journey! Whether you're struggling with anxiety, depression, unresolved childhood trauma, relationship issues or grief, I'm here to help. I work with clients to improve communication styles, set healthy boundaries and increase emotional regulation through mindfulness and grounding techniques. I'm here to assist my clients in navigating life's uncertainty, while promoting insight and self-awareness. My hope is that through this collaboration, you gain a new sense of empowerment, well-being and healing that allows you to live your best life!
## 2223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 797-5365
## 2224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2226                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Mike Rizzo, LMFT                                                                                                                                       I have worked in the addiction recovery field since 2004. From 2007 to 2019 I worked at the Los Angeles LGBT Center, developing and managing their Addiction Recovery Services / Crystal Meth Recovery Services.  Since 7/19 thru 12/21 I was the Program Director of CAST Centers in West Hollywood. Please visit my website for more information.
## 2227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 987-6732
## 2228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2230                                                                                                                                                                                                                                                                                                                                               You’ve found your forever love and are ready to lay the foundation for a healthy, harmonious, and fruitful marriage (and maybe work out a few kinks before walking down the aisle). Being the thoughtful person you are, you decided it was best to seek out an experienced professional to support you as you embark on this exciting new chapter in your lives - and I’m so happy that you found me! It’s part of my calling to help conscientious couples create the healthy and harmonious relationships that they envision so that they can love deeply, build strong families, and make the world a better place, together. 
## 2231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 372-8685
## 2232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2234                                                                                                                                                                                                                                                                                                                                                                                                                                      Welcome! I am a licensed psychotherapist in Playa Vista, Ca, and I specialize in working with millennials, professionals, parents, and couples. We can work together on resolving relationship conflicts, coping with feelings of being overwhelmed at work and home, breaking free from unproductive patterns, overcoming parenting challenges, and finding more joy and purpose in life. When you join me in therapy, we will develop a therapy plan, that will introduce you to new strategies, targeted at meeting your specific goals.
## 2235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 736-5199
## 2236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, LMFT, EMDR  
## 2238                                                                                                                                                                                                                                                                                                                                                                                                                        I have 21 years experience working with children, families, individuals, and adults, as a Marriage and Family Therapist.  My therapy style is warm, thoughtful, and respectful. I bring mindfulness based techniques, EMDR, and expressive arts into my work with my clients, and I also utilize a strengths-based approach. We all have resilience and the ability to heal, we just sometimes need a little help finding it, and we all need someone with whom we can express ourselves fully. In discussing our challenges, we can transform our lives.
## 2239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 709-8538
## 2240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist Associate, AMFT  
## 2242                                                                                                                                                                                                                                                                                                                                                                                                                Together, we will build an authentic, trusting connection where it is safe to unmask the parts of ourselves we normally hide. When someone seeks therapy, they are looking to feel seen, understood, and heard. Through our relationship, we will nurture the parts of ourselves that feel neglected.  The relationship we have with ourselves is the foundation for all other aspects of our lives. My work focuses on nurturing that relationship to deepen fulfillment, practice self alignment, and feel more intimately connected with ourselves and others.
## 2243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 886-0480
## 2244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 2246                                                                                                                                                                                                                                                                                                                                                                       Are you looking to improve your mental health, relationships, and quality of life? Has addiction, depression, or anxiety taken over your life? My goal for everyone coming to me for therapy is to help create that lasting and meaningful change they seek. I provide you with ready-to-use skills to reduce overwhelming feelings, recover from past hurts and traumas, disengage from unhealthy patterns of behavior, and find freedom. Together we work to strengthen your self-awareness, self-worth, self-compassion, and acceptance thus empowering you to act on what you most value in this life.
## 2247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 464-2298
## 2248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2250                                                                                                                                                                                                                                                                                                                                                                                                                  Healing emotional wounds, whether due to low sense of self-worth, loss of a loved one, life transitions, or childhood trauma, can seem like a scary process. Often, depressed mood, anxious distress, irritability and grief can begin to manifest themselves physically in the form of muscle tension, headaches, nausea, and rapid heart beat. And, no matter how much one tries to "get over it" and think positive, those negative and worrying thoughts continue to creep in, impairing sleep, one's social life and ability to complete day-to-day tasks.
## 2251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 409-4916
## 2252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 2254                                                                                                                                                                                                                                                                                                                                                                                              My approach to therapy encompasses warmth, humor, empathy and effective strategies to help you work through barriers that cause you to feel stuck, unfulfilled and disconnected. Our work together will help you generate more insight into your thoughts, feelings and behaviors in order to understand and work through the unconscious processes that are getting in your way. Cultivating a healthy relationship with yourself is the most rewarding investment you can make and I am committed to creating an environment where you feel inspired to make meaningful change.  
## 2255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 693-9608
## 2256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Marriage & Family Therapist, LMFT, PMH-C  
## 2258                                                                                                                                                                                                                                                                                                                   Adulting is already hard enough; throw in infertility, postpartum depression/anxiety, pregnancy following loss (heIlo, anxiety!), loss/grief/bereavement, trauma, relationship/communication issues, boundaries and family conflict and now you've got discomfort, unpleasant feelings, disconnection and stress. While we may not be able to change all of the obstacles in your life, we can certainly work collaboratively to adjust expectations, reinforce coping skills, strengthen resilience, improve communication skills, set boundaries, process trauma and elicit clarity and direction.    (This is a small, boutique group Telehealth practice).
## 2259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 366-4404
## 2260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 2262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               As a licensed psychologist, my clinical experience is with individuals, children, adolescents, and families dealing with stressful and agonizing life events.   In addition, my professional expertise also includes providing psychological testing and evaluations, psycho-educational assessments, and immigration evaluations.
## 2263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 294-8902
## 2264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Marriage & Family Therapist, MA, LMFT, MFC  
## 2266                                                                                                                                                                                                                                                   "The purpose of therapy is to remove blocks to truth; to help you abandon any patterns of belief that no longer serve you in a productive way; to implement self-forgiveness.   Therapy can alleviate suffering and open the door to peace of mind.  It can assist in separating illusion from reality and even reality from truth.   Finally, it can help you to learn to make your decisions from internal prompts because you have created an internal locus of control."   From "A Course in Miracles"                                                                                                           Most clients start noticing change in their perspectives, outlook and coping skills early in the process.
## 2267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 985-1093
## 2268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       My clients are brave and looking for a reflective, containing space to work through sadness, worries, chronic stress, transitions, familial and cultural stressors, and relationship difficulties. Therapy requires connection, vulnerability and collaboration; together we'll disrupt toxic stress and make progress toward your goals. We’re all lovable and deserving of rest and joy.
## 2271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 916-4460
## 2272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2274                                                                                                                                                                                                                                                                                                                                               You’ve found your forever love and are ready to lay the foundation for a healthy, harmonious, and fruitful marriage (and maybe work out a few kinks before walking down the aisle). Being the thoughtful person you are, you decided it was best to seek out an experienced professional to support you as you embark on this exciting new chapter in your lives - and I’m so happy that you found me! It’s part of my calling to help conscientious couples create the healthy and harmonious relationships that they envision so that they can love deeply, build strong families, and make the world a better place, together. 
## 2275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 372-8685
## 2276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, LMFT, PsyD, Life, Coach  
## 2278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Dr. Wendy M. O'Connor is a licensed Marriage and Family Therapist as well as holds a doctorate in psychology and is in private practice in Brentwood & Encino California. She has worked in various settings with over seventeen years of experience in the community.  Dr. Wendy O'Connor & Associates specialize in single adults, couples & teens.
## 2279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 906-4422
## 2280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      My results oriented approach is derived from a commitment to each individual’s conscious process of development.  Gaining deeper insight into yourself and what you what you want is the groundwork for manifesting your goals in career and relationships.
## 2283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 906-4716
## 2284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       PhD, MSW  
## 2286                                                                                                                                                                                                                                                                                                                Due to a unique combination of both professional and personal experience in adoption and infertility, who better to guide you through your transition, adoption journey or adoptive parenting. If you have experienced infertility/secondary infertility, and are considering growing or expanding your family through adoption and don't know where to start, then I can help. If you are already a prospective adoptive parent, I can provide educational and supportive services, including monthly support groups. If you are an adoptive parent needing support with an open adoption relationship or talking to your child about adoption, I can also help.
## 2287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (855) 530-2758
## 2288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, LMFT, LCSW  
## 2290                                                                                                                                                                                                                                                                                                                                                  TRS is dedicated to healing our communities through a holistic approach to quality therapeutic practices and wellness.  We promote growth and resilience by helping you integrate all aspects of yourself: mind, body & spirit. We aspire to model for our clients that strength, hard work, love and dedication can help make your dreams come true. As women of color we understand the importance of having a safe space to be yourself. As parents we can help you find  your unique balance of love and discipline with your child. As human beings we can support your journey of becoming the best version of yourself. 
## 2291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 919-0194
## 2292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2294                                                                                                                                                                                                                                                                                                                                               "We need never be hopeless because we can never be irreparably broken."  I want to help you fulfill your hopes to improve your life, relationships, and self. Call me for a free phone consultation and let's connect to get you the most out of therapy. I partner with clients in a non-judgmental and authentic setting to facilitate the changes you desire for your life and relationships. I specialize in helping  women and men struggling with low self-esteem, boundary setting, disordered eating, weight, and body issues, poor anger control, commitment, trust and intimacy issues, anxiety, depression, and trauma.
## 2295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 601-4425
## 2296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 2298                                                                                                                                                                                                                                                                                                                                                      Most of us pride ourselves on our strength and ability to "get through" life challenges. Yet, there are times in all of our lives when we seem be in a 'bad space' or things just seem out of alignment. People come to counseling because they are struggling with an issue, relationship, unresolved feelings, or feeling numb and apathetic to the world. Sometimes, we need insight into our choices and behavior or the impact of family dynamics on us. Counseling is about gaining insight, overcoming challenges, reconnecting mind, body, and spirit, fostering positive connections with others, and flourishing.
## 2299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 372-0563
## 2300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2302                                                                                                                                                                                                                                                                                                                                        We change what we acknowledge and accept. If you are seeking change, I provide a safe, supportive environment to build awareness, gain insight, and compassionately find acceptance of the factors blocking the change you seek. How? Therapy is both science and art. The science of therapy provides us with data that tells us which therapeutic strategies work best for specific problems. The art of therapy starts with the cumulative life experiences of the therapist--this is crucial in finding a good therapist and should not be discounted. A therapist should also be kind, empathic, humorous, direct, open, and honest.
## 2303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 638-2956
## 2304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2306                                                                                                                                                                                                                                                                                                                   I am here to help you heal and grow by VIDEO/phone as an experienced Christian Licensed Marriage and Family Therapist. Need coping skills I can help. I work with individuals and couples.  Are you experiencing a loss from death, divorce, health issues, work or a relationship and need a safe place to process? Are you experiencing conflict and need help overcoming? I offer insight into issues and patterns that keep you from the life you want to have. I give you the tools to improve your communication skills with others, manage stress, grief, conflicts, depression and anxiety. I offer SPIRITUAL and EMOTIONAL support in a safe setting.
## 2307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 377-4537
## 2308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2310                                                                                                                                                                                                                                                                                                                                         Do you argue with your teen? Lecture, yell, or worry too much? Are you not sure how to get through to your teen? I help parents understand their teens.  It is possible to have a different, positive relationship with your teen. You can become stronger & better equipped to take care of your teen. You can discover your unique teen and feel proud of who they can become. I can't make parenting easy, but I can make you feel more at ease parenting. My only goal is to be an educated guide. My stance with my clients is a combination of  finding strengths and exploring how our past may shows up in our current behavior.
## 2311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 230-7871
## 2312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Marriage & Family Therapist, MS, JD, LMFT  
## 2314                                                                                                                                                                                                                                                                                                                       I have over 12 years experience working in residential, intensive outpatient & outpatient settings, with people living successfully with mood disorders, substance abuse & dependence, disordered eating, and creating meaningful sense of interpersonal & relational patterns. My career has afforded me the privilege to work with young adults, professionals and aging adults throughout the Southern California area. I believe that as my clients, you know intuitively how you wish to grow and it's my job to listen with care so you can determine a route, means and hope to navigate a hopeful worthwhile path. I work hard with you in charge.
## 2315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (949) 541-8740
## 2316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2318                                                                                                                                                                                                                                                                                                                                                                                                                                                        To request an appointment please visit foresightmentalhealth.com - I am a client-centered therapist that focuses on addressing both negative and positive thought patterns and behaviors. I am very much focused on what people are saying as well as what they are not saying. I always verify that my interpretations or understanding of what patients are communicating is accurate. I believe very strongly they building a truth based in a trusting relationship is a key to a patient being able to make changes.
## 2319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 581-1244
## 2320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Marriage & Family Therapist, LMFT, PMH-C  
## 2322                                                                                                                                                                                                                                                                                                                   Adulting is already hard enough; throw in infertility, postpartum depression/anxiety, pregnancy following loss (heIlo, anxiety!), loss/grief/bereavement, trauma, relationship/communication issues, boundaries and family conflict and now you've got discomfort, unpleasant feelings, disconnection and stress. While we may not be able to change all of the obstacles in your life, we can certainly work collaboratively to adjust expectations, reinforce coping skills, strengthen resilience, improve communication skills, set boundaries, process trauma and elicit clarity and direction.    (This is a small, boutique group Telehealth practice).
## 2323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 366-4404
## 2324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, DSW, LCSW  
## 2326                                                                                                                                                                                                                                                                                                                                              Troubled by trauma and/or anxiety? If you're frustrated because you've been trying to find relief from your symptoms and have not, I'm the professional for you! I will teach you practical tools and techniques that are research-based and designed to engage you in skillfully working through your presenting emotional challenges. I specialize in working with adults with symptoms of PTSD, Complex PTSD, and anxiety. My clinical style tends to be warm, strengths-based, collaborative, and culturally informed. I have been licensed for 21 years and hold both a master's and doctorate degree in clinical social work.
## 2327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 716-1746
## 2328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Hi and thanks for researching my therapist profile. I specialize in adolescents/young adults as well as parenting support for post-partum depression, life transitions and the challenges of special needs parenting including assistance with navigating the regional center, additional therapies and the IEP process. I create a nurturing and safe environment and enjoy empowering parents to be their children's advocate for life! I look forward to connecting with you soon.
## 2331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 291-5705
## 2332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2334 "What's madness but nobility of soul at odds with circumstance (Roethke, 1961)."                                                                                                                                                                                                                                                                                                                                                                                            It is likely that you will come to see me because you are suffering.  I will help you understand the sources of your pain.  Together we will discover how past coping behavior, although understandable and partially sustaining given the challenges of your life, may become limiting and a source of dysfunction. In a safe and professional relationship, I will assist you to change old rigid ways of thinking and behaving to embrace new flexible and balanced responding to foster success.
## 2335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 618-7145
## 2336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, MFT  
## 2338                                                                                                                                                                                                                                                                                                                                                             The therapeutic relationship is unique.  It must offer the client a place to speak freely and safely about any and all problems, issues, and concerns that s/he is experiencing. I foster an atmosphere in which my clients are able to confide, question, explore and reflect, so as to better understand themselves and their lives, and make choices toward living fuller, more balanced, more satisfying lives. I listen closely and carefully.  I work interactively, asking questions and making observations. I am honored to see a diverse clientele of adults, couples, and adolescents and their families.
## 2339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 774-0460
## 2340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MS, AMFT  
## 2342                                                                                                                                                                                                                                                                                                                                                                                                       Shoutout to YOU for taking the first step to improving your life! Have you been feeling overwhelmed? Having relationship issues? Are you unhappy and unsure why? Ready to break unhealthy cycles? Or do you just need a safe place to process your thoughts and emotions?   I work with individuals and couples experiencing stress, anxiety, postpartum, trauma, depression, family or relationship conflict, anger, communication, self esteem issues, and cultural systemic oppression. I also provide Parenting Therapy to moms, dads, couples, and expecting parents.
## 2343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 918-3289
## 2344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MS, AMFT  
## 2346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  “Bridging is the work of opening the gate to the stranger, within and without.” – Gloria E. Anzaldúa. You’re at an inflection point. A chasm appears insurmountable. The ground has shifted; you’re on rocky terrain. The trail’s end is hazy, but you catch a glimpse: the outline of a hopeful future, somehow. Neglect can match abuse in its decimation of the soul. So let us nurture those neglected pieces of yourself too long ignored.
## 2347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 742-0939
## 2348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2350                                                                                                                                                                                                                                                                                                                                  Whether you’re dealing with depression, PTSD, grief, relationship issues, or other concerns, I will work with you to establish realistic, manageable goals so you can move toward the life you desire. I offer both individual and couples therapy, including premarital counseling. If you’re looking to experience overall growth and well-being or as a couple, I encourage you to schedule an appointment. My hope is that as a result of our time together, you will develop a deeper understanding of the challenges you’re facing, learn the necessary tools to overcome those issues, and gain peace to walk in your God-given purpose.
## 2351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 510-1455
## 2352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   You feel like you carry the weight of the world because you do. Too much work, or not enough. Relationship issues, or none at all. Interaction with family, blended and extended, parenting, you name it. Life is amazing, but at times it can be amazingly hard. Bring it all in. Let's unpack it and see how you can better manage the load.
## 2355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 218-0308
## 2356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist Associate, AMFT  
## 2358                                                                                                                                                                                                                                                                                                                                                                                                                Together, we will build an authentic, trusting connection where it is safe to unmask the parts of ourselves we normally hide. When someone seeks therapy, they are looking to feel seen, understood, and heard. Through our relationship, we will nurture the parts of ourselves that feel neglected.  The relationship we have with ourselves is the foundation for all other aspects of our lives. My work focuses on nurturing that relationship to deepen fulfillment, practice self alignment, and feel more intimately connected with ourselves and others.
## 2359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 886-0480
## 2360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist Associate, AMFT  
## 2362                                                                                                                                                                                                                                                                                                                  I love being a therapist because I believe healing is a human right and belongs to us all! I am trauma-informed, spiritually grounded and value the complexity of culture, identity and systemic injustice in how that affects individual and community mental health. I am trained in Relational Gestalt theory and integrate many other theories as there is not a cookie-cut treatment plan for anyone. Your journey is unique and I want to honor it. I am also inspired by the concept of "each one teach one." I enjoy sharing everything I've learned, delivered with warmth and humor, and then fostering your leadership to create a butterfly effect.
## 2363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 905-5146
## 2364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, PsyD, LMFT  
## 2366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          You want to live a life worth living. You want to connect with others in ways that work and stop attracting the same dysfunctional relationships. You want to be confident in your decision-making and have control over your actions and emotions. Pain often indicates the need for our loving attention to certain aspects of our inner life which need tending too.
## 2367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 267-6645
## 2368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Counselor, MS, LPCC, NCC  
## 2370                                                                                                                                                                                                                                                                                                                                                                                             Counseling services are provided to help couples, families, and individuals who experience issues dealing with life transitions, divorce, marital issues, self-fulfillment, personal growth, anxiety, depression and other discomforts that can cause major issues in their day to day lives.  I will help clients to understand themselves, set goals, think positively, and gain independence in their thoughts and abilities.  I find that most of my clients are looking to find a decrease in stress, acceptance, love, and strength to move on to the next part in their life.
## 2371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 863-1322
## 2372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Hello beautiful people. My most treasured skill as a therapist but most importantly as a human is the ability to connect and relate with almost any one no matter your race, gender, culture, sexual orientation, socioeconomic status, or age. I am learning in practice and in life that no matter how old, young, accomplished or established we become there will always be a natural human yearning we carry to feel like we belong and that we matter to others.
## 2375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 364-1104
## 2376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2378                                                                                                                                                                                                                                                                                                                       Many people are hurting in their day- to- day life. Sometimes the hurt is a personal one like depression, anxiety, poor self- esteem, grief and loss and other times it is a relational challenge within marriage, with children or teens and or with family or friends. Healing is possible though often times it is easy to loose sight of this or even be unsure of where to start.  I am here to help you take the first steps on your personal healing journey and guide you to navigate the process throughout. Don't let unspoken fears hold you back from getting help. You can thrive and not just survive but it all starts with the first step.
## 2379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 863-0621
## 2380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Registered Psychological Assistant, PhD, MPH  
## 2382                                                                                                                                                                                                                                                                                                                                         My clinical work is focused on treating mood disorders, emotion dysregulation, addiction, trauma, and self-harm. I specialize in working with adolescents, young adults, and minoritized people, including ethnic, sexual and gender minorities. In therapy, I use a strengths-based approach to identify and build on your existing coping skills. I aim to create a non-judgemental space to help you feel truly heard and safe to explore your vulnerabilities and areas for growth. I use a combination of warmth, directness, and humor to support you in learning new tools and more effective behaviors to live a life you value.
## 2383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                (424) 233-1175 x5
## 2384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Therapy For POC (at this time, Vanessa Cantu, LMFT) provides mental health support for people of color. Communities of color are struggling with mental health issues due to everyday life and the stress of life-threatening social issues. BIPOC would benefit most from services provided by a therapist of color who understands and can authentically support their lived experiences.
## 2387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 529-9833
## 2388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2390                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Mike Rizzo, LMFT                                                                                                                                       I have worked in the addiction recovery field since 2004. From 2007 to 2019 I worked at the Los Angeles LGBT Center, developing and managing their Addiction Recovery Services / Crystal Meth Recovery Services.  Since 7/19 thru 12/21 I was the Program Director of CAST Centers in West Hollywood. Please visit my website for more information.
## 2391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 987-6732
## 2392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist Associate, AMFT, APCC  
## 2394                                                                                                                                                                                                                                                                                                                                                                                                                                                     I am an Associate in both Marriage and Family Therapy and Professional Clinical Counseling. I have worked in both the university setting and in Intensive Outpatient Programs. I have a passion for individual therapy, couples, young adults, and working with those who are ready to start or continue their therapeutic journey. I hope for you to be able to share this part of your journey with me in a safe space, without judgement. I want you to be yourself with me as we dive deeper into your areas of concern.
## 2395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 496-3346
## 2396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, PsyD, LMFT  
## 2398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     You want to overcome addiction, substance use disorder, relationship or family issues but don't know how or where to begin. 
## 2399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 693-8521
## 2400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2402                                                                                                                                                                                                                                                                                                                                     Well-being involves having awareness of and connection to your self plus good connections with others. If you have struggled with distracting from your own experience, are lost in negative self evaluation, or if you have lost your curiousity about the world, face roadblocks or obstacles to your creativity and want to get relief, reclaim a sense of aliveness, vitality, presence, purpose or optimism - then I can be of help to you.  I developed Emotional Pilates - the focus is on helping you build your core emotional strength, balance, flexibility and resilience, including learning how to speak your true experience.
## 2403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 294-8574
## 2404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2406                                                                                                                                                                                                                                                                                                                                                                                     I have a passion for seeing my clients have a transformational experience, evolving toward becoming more self realized persons. Let's talk about your difficulties, fears, or sadness. Let's understand your anxiety or anger. And let's do it in a warm and safe space where we will set judgment aside. We'll explore how you became who you are today, and perhaps along the way you'll discover a kinder view of yourself, capable of moving away from bitterness or anger, unleashing your creativity, and ultimately knowing yourself through your profound relationships with others.
## 2407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 332-5169
## 2408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Associate Clinical Social Worker, A, S, W  
## 2410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   I work well with, young adults, adults and couples dealing with heavy emotions, confusion, or ADHD. If you are battling a lack of connection, motivation, sadness, negative thinking, racing thoughts, anxiety, or depression 
## 2411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 340-5859
## 2412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               My practice is currently taking on new clients with limited availability Spring 2023. Thank you.  Research indicates that the most important factor in psychotherapy may be the alliance between client and therapist.  It makes sense that any individual, couple or family would reflect heavily on this aspect of their search.  Initial consultations are about providing a uniquely safe, private space for the client(s) to share thoughts, questions, feelings or concerns.
## 2415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 294-8870
## 2416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       MD, PsyD  
## 2418                                                                                                                                                                                                                                                                                                                                                                                                                                    Your challenge may be aging, illness or chronic disease. Your job or your job satisfaction may be insufficient. Relationships and support from family and loved ones seem inadequate. Advice from friends and quick fix treatments are ineffective. You are not just a body, you are not just a mind. You are a complex individual who faces unique challenges. I can help you gain the strength and flexibility needed to surmount the challenges you face.  My goal is to help you uncover your true potential and lead a more joyful life.
## 2419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 242-1191
## 2420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, LMFT, EMDR  
## 2422                                                                                                                                                                                                                                                                                                                                                                                                                        I have 21 years experience working with children, families, individuals, and adults, as a Marriage and Family Therapist.  My therapy style is warm, thoughtful, and respectful. I bring mindfulness based techniques, EMDR, and expressive arts into my work with my clients, and I also utilize a strengths-based approach. We all have resilience and the ability to heal, we just sometimes need a little help finding it, and we all need someone with whom we can express ourselves fully. In discussing our challenges, we can transform our lives.
## 2423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 709-8538
## 2424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Relationship stress, conflict, and anxiety can rob the joy of dating and being in love.  The pain of not fully connecting, cheating, and addiction issues with a loved one can feel unstabilizing. 
## 2427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 621-3501
## 2428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Counselor, MA, LMHC, LPCC  
## 2430                                                                                                                                                                                                                                                                                                                                                                              Hello, I'm so glad that you have taken on this journey of introspection, growth, and healing. I'm Patricia Alvarado and I have been in the helping profession for over ten years, working with children, teens, and adults. I explore things from a multicultural lens, allowing me to understand your individual needs through active listening, empathy, and from a non-judgmental standpoint. I specialize in EMDR, CBT, Solution Focused Treatment, and Mindfulness which allows me to focus on my client's needs in the here and now to help create trust within the therapeutic relationship.
## 2431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 570-2494
## 2432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2434                                                                                                                                                                                                                                                                                                                                            I truly enjoy working with clients who are seeking understanding of themselves and wanting to create some change in their lives. I also understand that true intimacy is created from the client-patient relationship, therefore it is tantamount to find the right therapist that you (the patient) feels safe/comfortable enough to say anything that is needed in order to illicit insight/change.  I ask that all my clients outline specific therapeutic goals so that together we be clear as to our purpose and stay the course of treatment. I am client-focused and open to feedback since treatment is made for the client.
## 2435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 924-6521
## 2436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 2438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Maria has a broad range of experience working in underserved communities primarily working with survivors of trauma, women addressing post partum depression and TAY ages 16-25 who are prodromal to serious mental illness. Maria has also worked in  inpatient psychiatric hospitals and school settings with youth, families  and adults.
## 2439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 928-9352
## 2440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Psychologist, PhD, CAS  
## 2442                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Are you wondering… Why your child doesn’t talk much or seems to be quiet all the time? Why your child likes to be alone or has a hard time with friendships? Why your child does the same thing over and over again? Why your child insists on sticking to routines? If you have considered these questions, I have answers. As a Certified Autism Specialist (CAS), I have specific expertise in evaluation of neurodevelopmental disorders including Autism Spectrum Disorders (ASD) and Disabilities (ID). 
## 2443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 825-6273
## 2444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2446                                                                                                                                                                                                                                                                                                                                                                                                                             I am a licensed clinical psychologist with expertise in providing psychotherapy to adults and their families. I have provided treatment and conducted evaluations for individuals in clinical settings from private practices, to hospitals, to community health centers. I have a true passion for working with clients from diverse cultural backgrounds and values cultural awareness in a therapeutic setting. I empower individuals to enhance their lives through the application of evidence-based therapeutic models and relational support.
## 2447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 477-3608
## 2448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Licensed Professional Counselor, MA, LMFT  
## 2450                                                                                                                                                                                                                                                                                                                                             Are you a survivor of trauma? Are you a BIPOC/POC (person of color), LGBTQIA+, immigrant or 1st-generation American in your 20s, 30s, or 40s? Do you feel lost, hopeless, anxious, or isolated, like no one "sees" you for ALL of who you are? Do/did you have narcissistic or borderline parents - and trouble living up to their (or your) perfectionist standards? Do you often feel "not good enough," "bad," ashamed, guilty, or unworthy of love? Do anxiety, depression, chronic, negative thinking, or self-defeating patterns hold you back or prevent you from moving forward and living a life you want /deserve to live?
## 2451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 919-5877
## 2452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist Associate, MACLP, AMFT, MEd  
## 2454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Taking the first step to walk through your journey to healing can be difficult. My goal is to walk the path with you, hand in hand and provide the support you need to get to the other side. 
## 2455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 362-5343
## 2456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, PsyD, LMFT  
## 2458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     You want to overcome addiction, substance use disorder, relationship or family issues but don't know how or where to begin. 
## 2459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 693-8521
## 2460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Psychologist, PhD, LP, NCSP  
## 2462                                                                                                                                                                                                                                                                                                                           Dr. Tierra is most passionate about helping you heal - and grow in your healing - so that you may continue to walk in your purpose. She is committed to providing culturally relevant services so that your healing experience aligns with your cultural values and true authentic self. She is also  committed to assisting you in taking your healing into your own hands which is why she is devoted to providing mental health education and advocacy support throughout the process while helping you to prioritize yourself via self-love and self-care methods. Dr. Tierra also conducts Hip Hop & Healing group workshops for $25 per session.
## 2463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 531-5609
## 2464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2466                                                                                                                                                                                                                                                                                                 I am a Licensed Marriage and Family Therapist eager to collaborate with other mental health professionals to provide comprehensive and holistic treatment to clients struggling with pervasive disorders. I have extensive experience working with adults and Transitional Age Youth. I currently work with children in the age group 0-15 with their families. I have demonstrated skills in creating and implementing effective and individualized treatment plans and over 6 years of experience with Department of Mental Health standards and paperwork. In addition, I have foundational coursework and training in Cognitive-Behavioral and Dialectical Behavior Therapy.
## 2467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 945-2227
## 2468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2470                                                                                                                                                                                                                                                                                                                                                                                                                                    Do you find that you have difficulty trusting others and it's started to affect your relationships? Have you been isolating more and struggle to find motivation and interest in your normal activities? Perhaps your mood has changed or you feel more fearful and worried. These experiences can have a huge impact on your daily life and are incredibly hard to manage on your own. If this is the case for you and you are ready for change, I can offer specific tools and strategies to help you work towards what's important to you.
## 2471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 577-1228
## 2472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2474                                                                                                                                                                                                                                                                                                                                                                  My role as your therapist is to walk alongside you on your journey of growth and help you discover your inner strengths and power to live a fulfilling life. I provide a safe place for clients to express their experiences, thoughts, and feelings and treat everyone with respect, compassion, and a culturally competent perspective. I have specialized training utilizing evidence-based practices that were developed to ensure strength-based, research-backed interventions and treatment. These include but are not limited to CBT, IPT, Seeking Safety, Brain Spotting, TF-CBT (Trauma-Focused CBT).
## 2475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 683-5712
## 2476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2478                                                                                                                                                                                                                                                                                                                                                                                                                  Healing emotional wounds, whether due to low sense of self-worth, loss of a loved one, life transitions, or childhood trauma, can seem like a scary process. Often, depressed mood, anxious distress, irritability and grief can begin to manifest themselves physically in the form of muscle tension, headaches, nausea, and rapid heart beat. And, no matter how much one tries to "get over it" and think positive, those negative and worrying thoughts continue to creep in, impairing sleep, one's social life and ability to complete day-to-day tasks.
## 2479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 409-4916
## 2480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2482                                                                                                                                                                                                                                                                                                                                                             CONFIDENTIAL ONLINE APPOINTMENTS VIA VIDEO AVAILABLE!  I am able to help people looking to move past a barrier that seems insurmountable; whether it be feelings, like grief, depression or anxiety, circumstances, like a stalled career or sudden loss of a job or relationship, or simply feeling unseen or unheard by those around them.  Micro-aggressions based on race, gender or sexual orientation that no one else seems to get can be expressed and processed in our work.  Dreams, waking and actual, can be explored and a need to discover and embrace your identity, in all of it's forms can be met.
## 2483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 221-6123
## 2484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Are you overwhelmed with life? Do you want to pursue your purpose with a peaceful mind without resorting to medications? I help you discover your unique spiritual path to complete, emotional healing. I help determined, purposeful women live the courageous life they were designed for.  I  can help you clear the ruts and unhealthy patterns so that you could live the life you were meant to live in a natural, holistic way!
## 2487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 239-1983
## 2488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Clinical Social Work/Therapist, MSW, LICSW  
## 2490                                                                                                                                                                                                                                                                                                                                                                           Every individual has an incredible well of innate potential and power to heal, self-actualize, and achieve their most authentic and incredible life. My role is to collaborate with others to catalyze that potential, to accelerate healing. Persons seeking counseling are individuals not content with status quo or complacency. They want to be their best selves and to expand their lives to make them as fulfilling and incredible. It is my greatest honor to provide the sacred space  and clinical expertise that allows others to complete the work of evolving into their truest selves. 
## 2491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (715) 574-2438
## 2492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Counselor, PhD, LPCC, MDiv  
## 2494                                                                                                                                                                                                                                                                                                                          My clients are very diverse and cross all cultural backgrounds. They are often dealing with PTSD, and the accompanying depression/anxiety and old damaging beliefs. I help them reclaim their lives with techniques involving cutting edge brain re-training that is more effective at creating permanent healing than talk therapy. By rewriting the brain's programs that have accumulated over a client's lifetime, we create emotional well-being, peace, joy and self-acceptance. I work with many issues, including mood disorders, relationship issues, conscious uncoupling, addictions and sexual issues. Text me for more info: 831-888-6201.
## 2495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (831) 240-4758
## 2496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 2498                                                                                                                                                                                                                                                                                                                                                         I approach therapy from the perspective that we all have inner wisdom, courage, and resilience.  Sometimes, however, these strengths are blocked, forgotten, or have been inaccessible to you. I encourage you to become compassionately curious about yourself so that you can develop insight into these block and plans of action to overcome them. I work from a "strength-based" perspective which encourages you to focus and hone in on your strengths, while carefully and objectively addressing and confronting the factors keeping you from living a full, authentic, peaceful, inspired, and empowered life.
## 2499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (347) 418-0939
## 2500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Counselor  
## 2502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Hello, my name is Jamal and I am a Licensed Professional Clinical Counselor with four years of experience collaborating with diverse communities including preteens, adolescents, adults and older adults, couples, families, and underrepresented groups.
## 2503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (858) 533-1853
## 2504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Marriage & Family Therapist, PhD, LMFT  
## 2506                                                                                                                                                                                                                                                                                                                           ATTENTION FAMILIES AND COUPLES: Are you and your partner struggling with communication? Do you find that you argue about things that are seemingly insignificant? Has your relationship evolved into a power struggle? There may be triggers in your relationships that create conflict that you  simply are not aware.  I can help to lower the reactivity  and to help bring back the love and understanding you once had. Learn to disagree safely.  Communication skills are my specialty.\nMy Passion are those couples that are from different backgrounds or from different countries, biracial or where there is a significant age difference.
## 2507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 253-9827
## 2508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist Associate, AMFT, ACC  
## 2510                                                                                                                                                                                                                                                                                                                    I believe we all possess what we need for wholeness, yet through a lot of self-help in the zeitgeist right now we’re asked to move the ground of our own being and follow formulas instead of trust the process & our intuition. Through our therapeutic relationship you bring your healing aptitude forward, and we establish a safe space where wounds, old stories, traumas, and any ways life has tamed you can be tended. The process of rewilding your soul and spirit and stepping into a new state of consciousness can be challenging and present with some pain and discomfort. I meet you lovingly, with an empowering & heart-centered approach.
## 2511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 463-2972
## 2512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 2514                                                                                                                                                                                                                                                                                                                                                                                                                                        Life can be tough. We sometimes find ourselves feeling unfulfilled, anxious, depressed, and stressed. I work with individuals, couples, adolescents, military, veterans, first responders, and families. I have a broad scope of clinical experience, including supporting clients with depression, anxiety, marital conflict, career transition, and trauma. I believe healing is best accomplished by addressing challenges through a holistic lens which includes the mental, physical, emotional, and spiritual aspects of ourselves.
## 2515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 367-9652
## 2516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Looking for the "right" therapist? Emmada's therapists are here to help. We specialize in helping clients understand themselves and navigate their lives in light of the cultural complexities that influence their experience. We offer an interpersonal approach to the whole person that addresses the emotional and relational challenges that hamper your vitality and ability to thrive.
## 2519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              (626) 243-2886 x105
## 2520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2522                                                                                                                                                                                                                                                                                                                        You're the man or woman who helps everyone - but who helps you? Maybe you think you "should" be able to cope, yet you find yourself feeling angry and unheard? For 30+ years, I've been helping individuals, professionals, and families communicate more effectively, to reduce the anger, stress, and conflict life hands all of us at times. If those old coping skills aren't working, you might be struggling alone to make sense of your feelings and behaviors. I know that alone can be lonely; your personal and professional relationships may suffer, as you try to cope with the mounting stresses that come from not getting your needs met.
## 2523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 475-1759
## 2524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Psychologist, MA , PD, PsyD  
## 2526                                                                                                                                                                                                                                                                                                                                             My clients usually approach me when they are ready to make a change in their lives. They are experiencing conflicts, inside themselves or with others, and are looking for an empathic, flexible and dynamic clinician to provide support and guidance. Hello, I am Dr. Keisha C. White, a Clinical and School Psychologist in private practice (virtual/telehealth therapy) at MLH Psychology and KCW Psychological Services.  My work has focused on helping individuals with anxiety, stress, trauma, depression, self-esteem, interpersonal relationships (family, platonic, romantic), work-life balance, and life transitions.
## 2527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 207-5454
## 2528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2530                                                                                                                                                                                                                                                                                      As the world gets more and more complicated so does our ability to manage its day to day stressors. While searching for a therapist I hope you realize that you are not alone. Many of us find ourselves battling depression, anxiety, existential angst, interpersonal problems, trauma, loss and other symptoms related to an increasingly technological society. I see myself as someone who can kindle a light as one navigates such gnarly terrain.  My traditional face to face and remote on-line sessions offer, diagnosis, treatment, nonjudgmental support, confidentiality, encouragement, expertise and comfort while you explore new ways to improve the quality of your life.
## 2531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (646) 736-2239
## 2532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               We live in stressful times and seem to face more challenges every day.  I have 15 years of clinical experience and I understand many of the societal, familial, and interpersonal factors that cause us to feel unbalanced.  I provide my clients with a supportive environment to address concerns, gain insights, and achieve real change in their lives.  I strive to help people find their confidence and strength during times of adversity.
## 2535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 2536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Psychologist, PsyD, PhD  
## 2538                                                                                                                                                                                                                                                                                                                 Treatment with me is a dedicated  journey to your growth and wellbeing. I offer the highest level of clinical expertise,3 doctorates, with absolute regard to you as a unique individual. I am committed to help you learn and improve your life. My specialization in attachments (parents and beyond), will provide you with essential understanding of the impact of early relationship on current difficulties. Additionally, my dialectical and metallization expertise will help you develop skills to alleviate anxiety/depression and improve all relationship, yourself included. I will help you increase calmness, joy, confidence and understanding.
## 2539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 310-7047
## 2540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, PsyD, LMFT  
## 2542                                                                                                                                                                                                                                                                                                                                                                                                                                      Welcome! I want you to know that engaging in counseling is not an admission of failure. On the contrary, it is a bold statement of growth and strength. I specialize in Borderline Personality Disorder, Couples and Marital Counseling, and Trauma. Most of my clients find me easy to talk to and appreciate my practical and relational approach to treatment. Call for a free consultation - ACCEPTING NEW CLIENTS. I accept Private Payors, Cigna, Blue Shield of California, Magellan, United Healthcare, and Optum Health Insurance.
## 2543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 287-0456
## 2544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2546                                                                                                                                                                                                                                                                                                                                                                                                                              After receiving my BA in Psychology from California State University, Northridge and my MA in Clinical Psychology from Pepperdine University I found my calling in supporting and assisting adolescents and their parents with navigating educational, emotional and mental health needs on middle and high school campuses.  I quickly recognized my true joy and passion advocating for the social and emotional wellness of students and decided to broaden my scope of practice to working with students and clients of all ages and varieties.
## 2547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (858) 365-9173
## 2548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, MFT  
## 2550                                                                                                                                                                                                                                                                                                                                                                                  It's very important in therapy to know for sure that your therapist really "gets" you. At GTC, we’re LGBTQ therapists for LGBTQ people. I founded the Gay Therapy Center in 2015 because I believe in the healing power of LGBTQ people working with LGBTQ therapists. We've now grown to become the largest private LGBTQ therapy provider in the country with therapists in DC, NYC, SF, LA, and online. We personally match you to the therapist we think will be particularly good for you! You won’t have to deal with waiting lists, sifting through profiles, or matching by algorithms.
## 2551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (415) 795-2945
## 2552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2554                                                                                                                                                                                                                                                                                                                                       I work with adolescent and adult clients in individual, couples & family therapy. My personal philosophy is that through human connection, we can foster the encouragement needed to take courageous steps toward seeing an old pattern through a new perspective to create positive change. I use a strengths-based approach & believe in the inherent wisdom of each individual. Therapy thus serves as a road map, illuminating the path so the client can make conscious choices.  My attitude is one of respect and acceptance of each client's self-image and world-view allowing for the creation of a safe, therapeutic container.
## 2555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 325-2671
## 2556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2558                                                                                                                                                                                                                                                                                                                                               You’ve found your forever love and are ready to lay the foundation for a healthy, harmonious, and fruitful marriage (and maybe work out a few kinks before walking down the aisle). Being the thoughtful person you are, you decided it was best to seek out an experienced professional to support you as you embark on this exciting new chapter in your lives – and I’m so happy that you found me! It’s part of my calling to help conscientious couples create the healthy and harmonious relationships that they envision so that they can love deeply, build strong families, and make the world a better place, together. 
## 2559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (855) 997-4591
## 2560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 2562                                                                                                                                                                                                                                                                                                                                                                                                                                        Life can be tough. We sometimes find ourselves feeling unfulfilled, anxious, depressed, and stressed. I work with individuals, couples, adolescents, military, veterans, first responders, and families. I have a broad scope of clinical experience, including supporting clients with depression, anxiety, marital conflict, career transition, and trauma. I believe healing is best accomplished by addressing challenges through a holistic lens which includes the mental, physical, emotional, and spiritual aspects of ourselves.
## 2563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 367-9652
## 2564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 2566                                                                                                                                                                                                                                                                                                                                                         I approach therapy from the perspective that we all have inner wisdom, courage, and resilience.  Sometimes, however, these strengths are blocked, forgotten, or have been inaccessible to you. I encourage you to become compassionately curious about yourself so that you can develop insight into these block and plans of action to overcome them. I work from a "strength-based" perspective which encourages you to focus and hone in on your strengths, while carefully and objectively addressing and confronting the factors keeping you from living a full, authentic, peaceful, inspired, and empowered life.
## 2567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (347) 418-0939
## 2568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Marriage & Family Therapist, PhD, LMFT  
## 2570                                                                                                                                                                                                                                                                                                                           ATTENTION FAMILIES AND COUPLES: Are you and your partner struggling with communication? Do you find that you argue about things that are seemingly insignificant? Has your relationship evolved into a power struggle? There may be triggers in your relationships that create conflict that you  simply are not aware.  I can help to lower the reactivity  and to help bring back the love and understanding you once had. Learn to disagree safely.  Communication skills are my specialty.\nMy Passion are those couples that are from different backgrounds or from different countries, biracial or where there is a significant age difference.
## 2571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 253-9827
## 2572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, MFT  
## 2574                                                                                                                                                                                                                                                                                                                                                                                  It's very important in therapy to know for sure that your therapist really "gets" you. At GTC, we’re LGBTQ therapists for LGBTQ people. I founded the Gay Therapy Center in 2015 because I believe in the healing power of LGBTQ people working with LGBTQ therapists. We've now grown to become the largest private LGBTQ therapy provider in the country with therapists in DC, NYC, SF, LA, and online. We personally match you to the therapist we think will be particularly good for you! You won’t have to deal with waiting lists, sifting through profiles, or matching by algorithms.
## 2575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (415) 795-2945
## 2576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 2578                                                                                                                                                                                                                                                                                                                               I believe that a life well examined is a life worth living. It's important to truly know yourself, and what your strengths and limitations are.  My focus in treatment is based upon your goals for therapy, and what outcome you are hoping for. I have done much work within the LGBTQ + Community, and with couples across all ethnicities and orientations. Couples bring their own personal histories and experiences into the their relationships forming "unconscious contracts" with each other. I help them understand what those are between each other, in order to help them have a better understanding of why they chose each other.
## 2579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 962-4546
## 2580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Psychologist, PsyD, CAS  
## 2582                                                                                                                                                                                                                                                                                                                        As a Certified Autism Specialist (CAS), I currently provide comprehensive psychological evaluations of children and adolescents (including infants, toddlers, and adults). I specialize in the assessment of various developmental challenges commonly seen in young children and adolescents, specifically developmental delays, behavioral difficulties, and other “mannerisms” likely associated with an Autism Spectrum Disorder (ASD). I also provide evaluations of intellectual and learning disabilities, Independent Educational Evaluations (IEE), second opinions, and assessments that provide recommendations  and guide treatment planning.
## 2583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 275-8442
## 2584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2586                                                                                                                                                                                                                                                                                                                                                                     I have been working in the field of mental wellness, addiction, and trauma informed therapy for over 20 years. I've worked in treatment facilities, hospitals, holistic health, and outpatient programs as well as private and group therapy. I am trained in the science and psychedelic treatment renaissance. What drives my passion to serve others is witnessing a person's courage and commitment to wholeness. I blend a variety of treatment methods to individually help guide each person. I have developed the greatest compassion for others and their suffering through my OWN healing journey.
## 2587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 381-5816
## 2588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Do you desire caring, respectful, cooperative relationships without losing yourself in the process? Every individual deserves meaningful relationships that do not compromise her/his principles, values, or beliefs. As a Licensed Clinical Social Worker with 30 plus years of experience working with individuals, couples, parents, and families, I assist clients to realize and increase their full potential while decreasing negative thinking that may block this process.
## 2591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 570-3077
## 2592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Psychologist, PhD, PsyD, MA  
## 2594                                                                                                                                                                                                                                                                                                                   "Being listened to." That is the experience of being at the Saturday Center: intensely, deeply, actively, empathically listened to; seen, heard and understood.  For over 30 years we have provided this type of counseling and psychotherapy to individuals, couples, and families. TSC is committed to dynamic psychotherapy and to providing treatment based on need rather than economics. The Center is staffed by advanced psychological interns, psychological assistants and marriage & family therapist interns who are supervised by a group of experienced, licensed private practitioners dedicated to the practice and teaching of psychotherapy.
## 2595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 879-5804
## 2596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2598                                                                                                                                                                                                                                                                                                                                                                                       I've been in private practice for several years and in the field for over 20 years, working with adults, adolescents and children who have had relational issues, depression, anxiety and a number of other mental health issues.  I believe most of us go through periods in our lives when things get to be too much and our functioning is affected.  I help my clients to determine what the root issues are and to address them as effectively as possible by working with their strengths in order to increase insight and make behavioral changes that will alleviate the problems.
## 2599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 322-2850
## 2600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2602                                                                                                                                                                                                                                                                                                                                                                                               Choosing the right therapist is a fundamental part of not only ensuring your therapeutic needs are met but also lays the foundation so that you are able to achieve your goals of obtaining a more balanced emotional state of being. I believe in assisting my clients in identifying their goals, while exploring healthy strategies they can utilize in achieving these goals. Personal growth and happiness is a goal that is unique to each individual and utilizing multiple strategies assist clients in obtaining a healthier sense of self through awareness and insight.
## 2603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 894-0325
## 2604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Clinical Social Work/Therapist, PsyD, LCSW  
## 2606                                                                                                                                                                                                                                                                                                                                                                          I am an empathic individual who is passionate about assisting others to achieve their fullest potential.  I believe that every person has the power to change and to heal.  I am open and receptive to working with people of all genders, faiths, ethnic groups and sexual orientations.  I am confident that together we will work to resolve any issues you bring.  I specialize in treating trauma using EMDR and have seen many clients heal from traumatic events using this modality.  I also love working with people impacted by depression, anxiety and family issues surrounding addictions.
## 2607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (469) 812-5670
## 2608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2610                                                                                                                                                                                                                                               I am an Attachment Therapist.  My therapeutic approach is collaborative, interactive and individualized. I work together with clients assisting them to reach personal fulfillment, healthy and rewarding relationships, and empowerment. We accomplish this by overcoming longstanding obstacles, such as, negative thoughts, behaviors or emotions. Emotional limitations and fears are explored and conquered through insight and mindfulness, leading to clarity of understanding your path for personal growth. Insight opens the path to conquer obstacles, the way for cognitive behavioral changes, helps you achieve balance, reach your full potential and live a healthier life filled with joy and a sense of freedom.
## 2611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 668-1236
## 2612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Clinical Social Work/Therapist, LCSW, MFA, MSW, CAODC, CLPC  
## 2614                                                                                                                                       Are YOU Ready For SistahPeaceful Change ?(tm) . . . Facing A Distressing Dilemma ?. . . We Can Help You Find Peace Of Mind Again(tm) . . . Helping Unconventional, Artistic, Lesbian, Bi, Questioning, WOC, & Imaginative wimmin regain and maintain their Peace of Mind . . . Want to have a greater, more authentic, and meaningful sense of Self-regard, Self-accomplishment, Self-satisfaction and real happiness in those essential areas of your life?  . . . \n\nSHEINSPIRED(tm) Innovative & Holistic Counseling & Coaching For Wimmin . . . !  ~ AfraShe is LGBTQI-Affirmative, Psychospiritual, Solution-Focused, SpiraCulturally(tm) based, holistic and uses synergistic Eastern, Afrikan & Western, results-oriented approaches optimized to assist you to make Meaningful, Achievable SistahPeaceful(tm) Life-Style Changes.
## 2615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 507-1904
## 2616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2618                                                                                                                                                                                                                                                                                                                 Wounds, whether they are physical, emotional, mental or spiritual,  inflicted in the early stages of life can live on and be present in the daily moment to moment life experience.  Children and adults alike can have difficulty moving on and developing optimally in life after experiencing adverse or traumatic events.  In many cases issues such as depression, anxiety, panic, fear and other destabilizing mental and/or emotional challenges may be related to such experiences.  I offer support to those who have experienced intentional or unintentional pain or abuse heal and recover from those memories, and issues unrelated to early life. 
## 2619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 483-7741
## 2620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, MFT  
## 2622                                                                                                                                                                                                                                                                                                                                                                                                                                    If you find yourself repeating patterns that you just can't seem to break, feel stuck, or unable to find meaning in your life, I'd like to help. The therapeutic relationship can be a powerful source of healing, change and liberation in your life. I offer compassion and authenticity and believe that healing, and change are possible for all people. I am committed to discovering what is best for you and offer guidance through the darkest moments. Together we can unravel what keeps you in grief, depression, fear or anxiety.
## 2623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 282-7354
## 2624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Clinical Social Work/Therapist, MA, LCSW  
## 2626                                                                                                                                                                                                                                                                                                                                                Finding balance while juggling life's responsibilities can at times be overwhelming. We all need help sorting through our feelings. I have genuine empathy for people and the human experience. This quality underlines my passion to guide my clients to a purpose filled life.Whether you're faced with a temporary crisis or you're looking to learn skills necessary to have a balanced life - I offer a safe space, full of support with the goal to promote understanding and self-awareness.I understand that with work, finances, family conflict, relationship discord, parenting difficulties that life feels daunting.
## 2627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 321-4504
## 2628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Clinical Social Work/Therapist, LCSW, PPSC  
## 2630                                                                                                                                                                                                                                                                                                                                     I am a daughter of Guatemalan immigrants, mother, partner and a professional of color interested in providing therapy through a social justice lens.  I have experience and passion working with kids,adolescents, parents, college students, LGBT people, undocumented and women of color. An ideal client is someone who is willing to confront the most uncomfortable parts of themselves to strengthen self worth. If you have experienced trauma and difficult life experiences (addiction, grief and loss, deportation of a family member, abuse) I will gently guide you through an empowering and humanizing therapeutic experience.
## 2631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 374-0331
## 2632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Marriage & Family Therapist, LMFT, MSEd, PPS  
## 2634                                                                                                                                                                                                                                                                                                                                                                                                                                                                  My focus is helping each of my clients to achieve their best life and show up authentically. People usually turn to therapy because there is something "not working" in his or her life. I define my job as helping each individual figure out what is blocking him or her from achieving their potential. Kindness and empathy define my work as a therapist. I won't tell you what to do but instead will work to help you figure out what it is you want to do. Please call me If you'd like to get started!
## 2635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 446-2346
## 2636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Psychologist, MA, PhD  
## 2638                                                                                                                                                                                                                                                                                                                                                                                          Do you feel anxious? Overwhelmed? Sad? Are you struggling with a relationship issue or work stress? Dr. Shaye works in a therapy model to ensure that you see your feelings and situations change quickly, as you gain insight into your past and present to create a better future.                                                                                               Dr. Shaye provides a type of therapy that quickly promotes healthy relationships, decreases anxiety, and soothes depression. The office is beautiful and private to ensure client's are comfortable.
## 2639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 736-2810
## 2640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Marriage & Family Therapist, LMFT, MSEd, PPS  
## 2642                                                                                                                                                                                                                                                                                                                                                                                                                                                                  My focus is helping each of my clients to achieve their best life and show up authentically. People usually turn to therapy because there is something "not working" in his or her life. I define my job as helping each individual figure out what is blocking him or her from achieving their potential. Kindness and empathy define my work as a therapist. I won't tell you what to do but instead will work to help you figure out what it is you want to do. Please call me If you'd like to get started!
## 2643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 446-2346
## 2644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Psychologist, MA, PhD  
## 2646                                                                                                                                                                                                                                                                                                                                                                                          Do you feel anxious? Overwhelmed? Sad? Are you struggling with a relationship issue or work stress? Dr. Shaye works in a therapy model to ensure that you see your feelings and situations change quickly, as you gain insight into your past and present to create a better future.                                                                                               Dr. Shaye provides a type of therapy that quickly promotes healthy relationships, decreases anxiety, and soothes depression. The office is beautiful and private to ensure client's are comfortable.
## 2647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 736-2810
## 2648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2650                                                                                                                                                                                                                                                                                                                 Wounds, whether they are physical, emotional, mental or spiritual,  inflicted in the early stages of life can live on and be present in the daily moment to moment life experience.  Children and adults alike can have difficulty moving on and developing optimally in life after experiencing adverse or traumatic events.  In many cases issues such as depression, anxiety, panic, fear and other destabilizing mental and/or emotional challenges may be related to such experiences.  I offer support to those who have experienced intentional or unintentional pain or abuse heal and recover from those memories, and issues unrelated to early life. 
## 2651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 483-7741
## 2652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, MFT  
## 2654                                                                                                                                                                                                                                                                                                                                                                                                                                    If you find yourself repeating patterns that you just can't seem to break, feel stuck, or unable to find meaning in your life, I'd like to help. The therapeutic relationship can be a powerful source of healing, change and liberation in your life. I offer compassion and authenticity and believe that healing, and change are possible for all people. I am committed to discovering what is best for you and offer guidance through the darkest moments. Together we can unravel what keeps you in grief, depression, fear or anxiety.
## 2655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 282-7354
## 2656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2658                                                                                                                                                                                                                                                                                                                                                                                       I've been in private practice for several years and in the field for over 20 years, working with adults, adolescents and children who have had relational issues, depression, anxiety and a number of other mental health issues.  I believe most of us go through periods in our lives when things get to be too much and our functioning is affected.  I help my clients to determine what the root issues are and to address them as effectively as possible by working with their strengths in order to increase insight and make behavioral changes that will alleviate the problems.
## 2659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 322-2850
## 2660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2662                                                                                                                                                                                                                                               I am an Attachment Therapist.  My therapeutic approach is collaborative, interactive and individualized. I work together with clients assisting them to reach personal fulfillment, healthy and rewarding relationships, and empowerment. We accomplish this by overcoming longstanding obstacles, such as, negative thoughts, behaviors or emotions. Emotional limitations and fears are explored and conquered through insight and mindfulness, leading to clarity of understanding your path for personal growth. Insight opens the path to conquer obstacles, the way for cognitive behavioral changes, helps you achieve balance, reach your full potential and live a healthier life filled with joy and a sense of freedom.
## 2663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 668-1236
## 2664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   PsyD, MS, MA  
## 2666                                                                                                                                                                                                                                                                                                                                                                                         Visit My Online Booking Calendar: https://witandreason.clientsecure.me/request/service I am accepting clients who are seeking Coaching services to enhance their dating/love life, relationship skills, and/or their self-care and wellness goals. In addition to working one-on-one in telehealth/online coaching sessions, I provide mental health consulting services to workspaces, community organizations, and media personnel. My other coaching services include executive, media, and specialty coaching to help my clients master specific interpersonal and technical skills.
## 2667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 414-4423
## 2668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Psychologist, PsyD, MA  
## 2670                                                                                                                                                                                                                                                                                                                                                                                                                                                             I am not currently accepting new patients and all sessions are done over telehealth). As an African America, former USC football running back, and current clinical psychologist, Dr. Adewale is open to treating adults and adolescents, with behavior, emotional, psychological and family struggles. He uses various treatment methods and works to maximize individuals potential and improve their mental health. These methods include CBT, DBT, Family Therapy, addiction counseling, and couples counseling.
## 2671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (909) 547-3466
## 2672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Are you looking to heal from past experiences, work through a stressful life transition, or improve your family dynamics and relationships?  Do your relationships feel overwhelming and you can't seem to find your way to better days? I aid individuals in understanding how past traumas and other negative experiences affect behaviors and their interactions with others.
## 2675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (442) 244-9638
## 2676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Psychologist, LCSW, PsyD  
## 2678                                                                                                                                                                                                                                                                                                    I received my undergraduate degree from the University of Michigan in Political Science and my Masters in Arts: Social Work from the University of Chicago.  I received my doctorate in clinical psychology from the Chicago School of Professional Psychology.  I am a licensed clinical social worker and have worked in many settings from community mental health and crisis intervention to victim advocacy.  I am a trained medical/legal sexual assault advocate and a trained domestic violence counselor.  I completed my psychology internship at the Cambridge Health Alliance/Harvard Medical School in a program in Asian Mental Health and Child Psychotherapy.
## 2679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (312) 818-5290
## 2680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2682                                                                                                                                                                                                                                                                                                                                                                                                                                   Depression, anxiety, infidelity, sexual abuse and behavioral issues can lead to feeling depressed, frustrated stuck in a cycle, and experiencing difficulty finding your way. I commend you for taking the first step towards seeking assistance. As your Therapist, you will receive professional Therapeutic guidance, in a confidential safe setting. "Helping you to move forward on your journey in life is my reward". Women, men, couples and families often face tremendous stress, managing life responsibilities and relationships. 
## 2683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (909) 345-5832
## 2684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 2686                                                                                                                                                                                                                                                                                                                                                         Do you need support to remove barriers and work through obstacles?  Do you want to accomplish goals and live in your purpose?  Do you feel highly accomplished and just need a little help in maintaining your life balance and successes?   Everyday, in every way we have the ability to get better and better, and I would be honored to support you in your journey. I have a passion and purpose to be of  meaningful service to others. I combine my education, professional and real world experience to provide gentle, honest, and insightful care within a compassionate, client centered, spiritual approach.
## 2687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 418-5503
## 2688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2690                                                                                                                                                                                                                                                                                                                 First and foremost, I am a client-centered psychotherapist ready to assist individuals who have experienced various traumas. Besides being an experienced licensed psychotherapist, I am a veteran, serving both male and female veterans who have served or are currently serving in the U.S. Armed Forces.  With my past military service and current clinical experience in assisting clients with resolving issues of Posttraumatic Stress, Depression, Sexual assault, and Domestic Violence. I am well suited as I am empathetic, compassionate, and supportive to the military veteran and others who are currently seeking support & personal solutions.
## 2691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 843-4594
## 2692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Marriage & Family Therapist, MA, JD, MFT  
## 2694                                                                                                                                                                                                                                                                                                                 Relationships bring happiness, but also create longing and loneliness. They can preoccupy us and destroy our sense of safety and self-respect. If you feel stuck, overwhelmed, afraid, or lost, or are unable to decide about staying or leaving, have irresolvable conflicts, unmet needs, or feel devalued, I can help - also if you seek guidance with codependency, trauma, communication, intimacy or self-esteem. You'll gain awareness in your first session and quickly see changes in handling emotions, conflict, and boundaries. Whether seeking individual or couple counseling, you'll find solutions, empower, and an improved sense of well-being
## 2695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 421-8996
## 2696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, MFT  
## 2698                                                                                                                                                                                                                                                                                                                                     I am a licensed psychotherapist with over 30 years experience in treating relationship issues and mood disorders such as anger, depression and anxiety.  My style is relaxed and supportive, and my attitude positive and non-judgmental.  I believe that resolving personal and relationship issues involves three major processes: identifying the root of the problem, recognizing and changing the dynamics that perpetuate it, and developing new strategies in order to sustain change.  My job is to help clients find the key that unlocks their inner strengths to understand themselves and interact more effectively with others.
## 2699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 400-6363
## 2700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 2702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Hello, I am a Licensed Marriage and Family Therapist who provides therapy in a culturally sensitive way. I have over 13 years of experience working with individuals dealing with self-esteem, trauma, family, marital, and relationship issues. I have also done extensive work with individuals in the areas of communication and boundaries.
## 2703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (714) 430-8730
## 2704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2706                                                                                                                                                                                                                                                                                                                        Talking about what is going on within you or your relationships can be a powerful experience. I have been helping adults, married couples, engaged couples, parents for nearly 24 years. I am certified in Brainspotting, a powerful and effective revolutionary psychotherapy treating trauma, panic attacks, anxiety and more. My additional specialty is helping couples and adults improve their communication skills and get unstuck. Please call me if you are ready for a real change in your life whether it’s growth or healing. Married or single please don’t wait anymore. Are you ready to make changes in your life or your marriage today?
## 2707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (678) 257-3324
## 2708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Psychologist, MA, PsyD  
## 2710                                                                                                                                                                                                                                                                                                                 WE OFFER EVENING AND WEEKEND APPOINTMENTS.                                                                                  My goal is to help you improve the quality of your life and make positive changes by reducing your Anxiety, Depression, eliminating stress, Addiction, and gaining back control. You will achieve a much higher quality of life in a safe, exclusive and caring environment. I will support you to discover your inner strength, and develop effective coping skills. You will experience freedom from emotional pain and feel empowered to achieve your goals and dreams. I provide CONCEIRGE care to executives and professionals.
## 2711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 888-6124
## 2712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, MFT  
## 2714                                                                                                                                                                                                                                                                                                                                                I first and foremost adapt my style of therapy to meet your needs.  We work together to identify what best supports you toward your goals or areas of focus in therapy.  Some clients progress through insight and understanding about an issue while others progress through tangible present-moment skills and tools, all of which I can provide support you with.  I also feel that Identity (race, gender, sexual orientation, etc) plays an important role about how we experience the world and how the world views us and I incorporate this into therapy.  I see therapy as an equal and collaborative effort between us.
## 2715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (510) 230-2498
## 2716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, LCSW, PhD  
## 2718                                                                                                                                                                                                                                                                                                                                                         What I do is help clients identify and understand thoughts and beliefs they have that keep them from feeling good about themselves and get in the way of living life to its fullest. Each individual has a unique view of the world and relationships etched out of our early experience.  If those experiences are good enough, then one is able to meet life's challenges, but if these experiences are wrought with dysfunction and trauma, meeting these challenges is much more difficult and one may require assistance from a professional who can safely facilitate exploration of the obstacles to fulfillment.
## 2719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 625-2956
## 2720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Psychologist, PsyD, MA  
## 2722                                                                                                                                                                                                                                                                                                                                                                                                                                                             I am not currently accepting new patients and all sessions are done over telehealth). As an African America, former USC football running back, and current clinical psychologist, Dr. Adewale is open to treating adults and adolescents, with behavior, emotional, psychological and family struggles. He uses various treatment methods and works to maximize individuals potential and improve their mental health. These methods include CBT, DBT, Family Therapy, addiction counseling, and couples counseling.
## 2723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (909) 547-3466
## 2724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Psychologist, LCSW, PsyD  
## 2726                                                                                                                                                                                                                                                                                                    I received my undergraduate degree from the University of Michigan in Political Science and my Masters in Arts: Social Work from the University of Chicago.  I received my doctorate in clinical psychology from the Chicago School of Professional Psychology.  I am a licensed clinical social worker and have worked in many settings from community mental health and crisis intervention to victim advocacy.  I am a trained medical/legal sexual assault advocate and a trained domestic violence counselor.  I completed my psychology internship at the Cambridge Health Alliance/Harvard Medical School in a program in Asian Mental Health and Child Psychotherapy.
## 2727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (312) 818-5290
## 2728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, LCSW, PhD  
## 2730                                                                                                                                                                                                                                                                                                                                                         What I do is help clients identify and understand thoughts and beliefs they have that keep them from feeling good about themselves and get in the way of living life to its fullest. Each individual has a unique view of the world and relationships etched out of our early experience.  If those experiences are good enough, then one is able to meet life's challenges, but if these experiences are wrought with dysfunction and trauma, meeting these challenges is much more difficult and one may require assistance from a professional who can safely facilitate exploration of the obstacles to fulfillment.
## 2731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 625-2956
## 2732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 2734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Hello, I am a Licensed Marriage and Family Therapist who provides therapy in a culturally sensitive way. I have over 13 years of experience working with individuals dealing with self-esteem, trauma, family, marital, and relationship issues. I have also done extensive work with individuals in the areas of communication and boundaries.
## 2735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (714) 430-8730
## 2736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, LCSW, PhD  
## 2738                                                                                                                                                                                                                                                                                                                                                                               Have you discovered over this past year that your life or your relationships are not really working for you?  I understand your need for an empathic, caring professional to talk with about your feelings and improve your relationships and your life.  With 20+ years of experience working with GAY MEN AND COUPLES, I know the importance of speaking with someone who understands our unique struggles.  As an EXPERT IN RELATIONSHIP AND INTIMACY matters, I am particularly sensitive to the impact and effects environmental stressors have on our relationships.  I am here to help you.
## 2739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (760) 454-1432
## 2740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Marriage & Family Therapist, MFT  
## 2742                                                                                                                                                                                                                                                                                                                                                I first and foremost adapt my style of therapy to meet your needs.  We work together to identify what best supports you toward your goals or areas of focus in therapy.  Some clients progress through insight and understanding about an issue while others progress through tangible present-moment skills and tools, all of which I can provide support you with.  I also feel that Identity (race, gender, sexual orientation, etc) plays an important role about how we experience the world and how the world views us and I incorporate this into therapy.  I see therapy as an equal and collaborative effort between us.
## 2743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (510) 230-2498
## 2744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2746                                                                                                                                                                                                                                                                                                                                                                                                                                   Depression, anxiety, infidelity, sexual abuse and behavioral issues can lead to feeling depressed, frustrated stuck in a cycle, and experiencing difficulty finding your way. I commend you for taking the first step towards seeking assistance. As your Therapist, you will receive professional Therapeutic guidance, in a confidential safe setting. "Helping you to move forward on your journey in life is my reward". Women, men, couples and families often face tremendous stress, managing life responsibilities and relationships. 
## 2747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (909) 345-5832
## 2748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             BA, CHT, ARTT, CMS  
## 2750                                                                                                     I help people of all ages feel more optimistic and enthusiastic about life, without medication. I specialize in the release of depression, anxiety, negativity, jealousy, lack of motivation, weight issues, perfectionism, anger problems and anything that is a result of low self-esteem. If you would like to move through the world with more confidence and ease, you must be willing to see yourself in a different way, and with Rapid Transformational Therapy and hypnotherapy, I can help you achieve that.   As human beings, we can get stuck in a pattern of negative thinking and that only keeps us from getting what we want. So, I work with the subconscious mind to change the neural pathways in your brain so that a new way of thinking can change your trajectory in this life, getting you out of your own way and giving you a fresh perspective. 
## 2751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 746-1051
## 2752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, MFT  
## 2754                                                                                                                                                                                                                                                                                                                                     I am a licensed psychotherapist with over 30 years experience in treating relationship issues and mood disorders such as anger, depression and anxiety.  My style is relaxed and supportive, and my attitude positive and non-judgmental.  I believe that resolving personal and relationship issues involves three major processes: identifying the root of the problem, recognizing and changing the dynamics that perpetuate it, and developing new strategies in order to sustain change.  My job is to help clients find the key that unlocks their inner strengths to understand themselves and interact more effectively with others.
## 2755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 400-6363
## 2756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2758                                                                                                                                                                                                                                                                                                                    Everyday living can be extremely stressful and difficult to navigate especially in these trying times. If you are experiencing depression and or anxiety from worry and fear, being overwhelmed, career disappointments or issues in your relationships. My priority is your overall mental and emotional wellness. I am committed to providing quality professional counseling in a faith-based private practice setting that is safe, non-judgmental, comfortable and confidential.  Those that experience depression and or anxiety often develop distressing and dysfunctional thoughts and behaviors that keep them stuck and rob them of enjoying life.
## 2759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 561-7409
## 2760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, LMFT, CAMF  
## 2762                                                                                                                                                                                                                                                                                                                     My name is Latoya Boston, Licensed Marriage & Family Therapist and founder of Real Moms Live.  I am passionate about helping children, adolescents and their families conquer unique challenges. I help families restructure circumstances. My work is about healing; embracing life & sharing experiences. Regardless the circumstance, I can help you create a safe space.  Over the last 21 years, I have been dedicated to providing services to empower emotional wellness. As we settle into this year, the most unique year we've collectively experienced, it's become clear that our children, adolescents and families require additional support.
## 2763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 553-5393
## 2764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2766                                                                                                                                                                                                                                                                                                                      I offer support and guidance to my clients as they grow and discover new ways of being. I meet you with a Client-Centered Approach that puts your needs and goals first. I do not see people as broken, like a machine, but as organically growing and adapting to our environment. Drawing from Mindfulness, Neuroscience, and Art Therapy, I have an abundance of tools to assist you in coping, adjusting, and changing your situation. I am very focused on being of service and supporting you in finding your state of wellbeing that persists no matter the circumstances of your life. Telehealth therapy available. For more see: MonicaMayall.com
## 2767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 658-4002
## 2768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Thank you for visiting my website.  I am currently not taking new clients.                                       In my work with individuals, I tend to focus on strengths and resources, historical patterns and relationships, goals and preferred ways of being.  My belief is that growth occurs in a collaborative therapeutic relationship exploring a fuller and richer personal context with the aim of opening space for new possibilities.
## 2771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 294-8933
## 2772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, MACP, LMFT  
## 2774                                                                                                                                                                                                                                                                                                                                 My practice is Buddhist psychotherapy which uses deep inquiry, self awareness and meditation.  My goals for therapy are, first, to alleviate suffering and second to deal with symptoms. Then we can address personal growth and existential issues.  Most of the work is done in the present moment and is little dependent on our past. The work usually goes quickly and very directly... but sometimes we need to go slow. A typical successful series might be 10-12 meetings. Spiritual matters are usually an important area of concern...What's really important? Is our behavior congruent with those values? So, tell me about that...
## 2775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (360) 529-4709
## 2776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 2778                                                                                                                                                                                                                                                                                                                               I am an executive corporate coach and Christian Counselor offering virtual services only. You want more, and you deserve MORE from life. You desire enhanced relationships, deeper understanding as to why you are where you are in life and want to take yourself to the next level.  I work best with clients who are willing to do the work and commit to being honest in this process. Maybe you are in the middle of a new transition (motherhood, divorce, prepping for college, relocation) and need support. I am here to guide the way. Maybe you suffer from depression, anxiety and perfectionism and you are seeking  peace of mind.  
## 2779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 304-1384
## 2780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 I believe the goal of therapy is for the client to feel seen and understood,  and that everyone has the capacity for growth and change.  By developing a caring, empathic, and trusting relationship with my clients, it becomes possible for the individual to make connections, deepen his/her awareness and gain clarity about relationships, problems and personal patterns.  It is through this process that growth and change can be made.
## 2783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (858) 437-5648
## 2784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Clinical Social Work/Therapist, MSW, LCSW, CHT  
## 2786                                                                                                                                                                                                                                                                                                                                                                    Feeling bored or frustrated with the sex in your relationship?  Lacking libido or orgasm?  You don't have to miss out.  Sex is important!  It's vital for your wellness, and for your relationship.  Sex can be a sensitive topic - so don't worry - I'll put you at ease with a comforting, non-judgmental approach that brings you more pleasure, desire, and emotional connection.  I've been in practice for 23 years and I'm passionate about helping you.  My background is in neuroscience, so my approach is evidence-based.  I know what works, and my goal is for you to have amazing sex and love.
## 2787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 241-0993
## 2788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Marriage & Family Therapist, MA, MSS, LMFT, #102289  
## 2790                                                                                                                                                                                                                                                                                                                 Uncertainty seems to be the new normal. You have managed through lockdown, mask confusion and mixed messages. You’re stressed about how long this will go on and what to expect next. Don’t keep struggling. Learn how to reduce stress and improve self care.  I help adults transform their lives by identifying and making Self honoring choices.  Learn to unhook from problems and tune into your innate, creative, grounded sense of wellbeing. Regardless of what's going on around you. I work with adults using a unique combination of inner process work and communication skills practice as needed to help you create the quality of life you want.
## 2791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 872-2568
## 2792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 2794                                                                                                                                                                                                                                                                                                                           I have current availability for families, couples, and underage minors.  My goal is to assist individuals struggling with trauma, PTSD, depression,  racism, families of persons with mental illness and family/couples therapy.  The challenges you face are not as important as the tools you need to navigate them.  The role I choose as a therapist is to walk with you on your journey to healing, helping you discover the tools that work for you, teaching you to use them, and celebrating you in your journey.   I honor the differences and diversities in us all, and do not believe in using a 'cookie-cutter' approach with my clients.
## 2795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 361-4203
## 2796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 2798                                                                                                                                                                                                                                                                                                                                                                                                                                              There are moments in life when we come across that are challenging to cope with, where we need deeper reflection and support. Therapy is an amazing tool to increase self-awareness, personal growth and improve our relationships with others. It can also be a vulnerable step to take. My role is to offer guidance and support throughout our time together. I work from a trauma-informed perspective, working to create a therapeutic environment that is non-judgmental, where the client feels seen, understood, and heard.
## 2799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 232-0913
## 2800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 2802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Today's world demands so much of us. The pressures to be everything, do everything, for everyone can cause stress, anxiety, and depression. We are human. And even the best of humans need support from time to time to bounce back from the challenges of life and live powerfully. It is time that you had a consistent partnership that focuses on your healing, growth, and emotional resilience.
## 2803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 790-7115
## 2804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Hello and Welcome. Our agency offers affordable telehealth therapy. We are dedicated to decreasing depression, anxiety, trauma, and relationship issues while increasing happiness, love, and resiliency. We provide individual therapy, couples therapy and group therapy.
## 2807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 293-1151
## 2808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2810                                                                                                                                                                                                                                                                                                                                                              I am a licensed clinical psychologist with extensive experience in providing psychotherapy. I currently work with adults who suffer from an array of psychological problems including but not limited to depression, anxiety, post-traumatic stress, and relationship problems. I am especially sensitive to cultural and gender issues and provide a personalized and integrated therapeutic approach using a combination of therapies: humanistic, psychodynamic, cognitive behavioral, dialectical behavioral, and family systems to help improve the individual's well-being, mental health, and relationships.
## 2811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 370-0969
## 2812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 2814                                                                                                                                                                                                                                                                                                                                                                                         Anchored in a strengths-based model, my online therapeutic services are for people like you and me. Some are struggling with a specific issue they can’t seem to solve on their own, while others are seeking to improve a skill or process an old unhealed wound.  Utilizing a collaborative strengths-based model my objective is to help you identify & release the negative patterns that have you trapped in a cycle of unfulfilled living. Trauma and stress can rob you of the best parts of yourself, my goal is to help you recover your gifts, and regain your fulfilled Life.
## 2815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 929-9725
## 2816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Pre-Licensed Professional, MS, RMHC  
## 2818                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Ideal Clients: Anyone who is going through a break up with your partner or current employer. Entrepreneurs seeking to launch a new business or professionals seeking to enhance leadership/communication skills. If you are experiencing stress or overwhelming feelings from events in your life that are happening you may be in the middle of a transition or major change in your life. I can offer you tools to help you change this transition into a transformation into being your ideal "MVP". 
## 2819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 317-7694
## 2820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 Clinical Social Work/Therapist  
## 2822                                                                                                                                                                                                                                                                                                                                                                                                                Currently welcoming new clients and offering Telehealth services through HIPAA compliant video platform! Navigating through todays society is already hard enough; throw in depression/anxiety, trauma, relationship/communication issues, loss/grief/bereavement, and family conflict and now you've got a whole new amount of stress and discomfort to deal with. While we may not be able to change certain aspects of life, we can change how we process, adjust expectations, cope, improve communication skills, set boundaries, and strengthen resilience.
## 2823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 873-0769
## 2824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Licensed Professional Clinical Counselor, MA, LPCC  
## 2826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     Life is unpredictable and often throws trials that we weren’t expecting.  To combat this I work with children, teens and adults to heal and grow.  Whether it is dealing with sadness, anxiety, life transitions or parenting concerns, everyone deserves someone to talk to. Many times when we leave these problems unresolved they compound and hurt other areas of life.
## 2827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 734-4514
## 2828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Daniela Yanet Alvarado is a licensed Clinical Social Worker based in Huntington Park, California. Known for her inclusive and community-focused therapy approaches, Daniela blends evidence-based practices with culturally compassionate therapies that serve people of color.
## 2831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 827-8054
## 2832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2834                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Are you feeling overwhelmed and stressed out? Do you suffer from obsessive anxious and depressive thoughts? Are you tired of not feeling like yourself?  I empower you to take control over your life by utilizing evidenced based practices combined with solution-focused, strengths-based, empathetic, trauma informed and holistic approaches. After each session you will walk away with enhanced coping skills to battle your mental health symptoms and gain a deeper understanding of yourself.
## 2835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (858) 422-3003
## 2836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 2838                                                                                                                                                                                                                                                                                                                                                                                                                                              There are moments in life when we come across that are challenging to cope with, where we need deeper reflection and support. Therapy is an amazing tool to increase self-awareness, personal growth and improve our relationships with others. It can also be a vulnerable step to take. My role is to offer guidance and support throughout our time together. I work from a trauma-informed perspective, working to create a therapeutic environment that is non-judgmental, where the client feels seen, understood, and heard.
## 2839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 232-0913
## 2840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2842                                                                                                                                                                                                                                                                                                                                                                                                               My role as a therapist is to help you gain power over the direction of your life. Do you want to set a solid foundation for your relationship? Let's do it. Are you looking for a more meaningful relationship? Let's see what that looks like for YOU. Are you feeling weighed down and unable to move forward? Lets see where that's coming from and get you to where you want to be. There is no better time to invest in yourself than now. I'm here to support you to your next stage of change.  It's like personal (physical) training, but for your mind. 
## 2843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (916) 264-9099
## 2844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2846                                                                                                                                                                                                                                                                                                                                                                                               I have years of experience working with trauma, anxiety, depression, grief, and difficult life transitions. Whether you are looking to heal from pain from the past or trying to find a way to move forward in your life, you don’t have to go through it alone. I strive to create a safe, non-judgmental relationship where individuals feel validated and empowered to overcome life’s challenges and lead a more fulfilling life. My approach is person-centered and one of collaborative self-exploration where I see myself as a guide to help you get where you want to be.
## 2847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 496-8473
## 2848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Marriage & Family Therapist, LMFT, PsyD  
## 2850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Our goal is to assist individuals and families suffering from the devastating effects of anxiety, depression, and trauma in returning to an adaptive level of functioning.
## 2851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 320-6248
## 2852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2854                                                                                                                                                                                                                                                                                                                  You’re feeling worried, stressed, and overwhelmed with the day-to-day hustle of life, and you feel like you carry the weight of the world on your shoulders. You look like you've got it all together on the outside, but you’re struggling to feel like you’re enough on the inside. You're trying your best to hold it together, but you’re exhausted. It feels like no matter what you do, life still feels all over the place. You're ready to press the pause button and tend to yourself - to get to know how you feel, to think about what you want, and to make choices that serve your well-being. You're ready to make some changes but not sure how.
## 2855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 336-5187
## 2856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 2858                                                                                                                                                                                                                                                                                                                   NOT ACCEPTING NEW CLIENTS ** With empathy and openness, I help clients live in more authentic ways. I focus on a client's internal motivations for change in order to address what may NOT be working well for them, or to strengthen and maintain what may be working well enough. Clients who work with me in couple's/family counseling, experience me as affirming, fair, balanced, reflective and interactive as needed. I am here to help clients identify and reclaim their core values and find healthy ways to live out those values, in order to enhance client health, wellness and success.  Ebook: unbaitable-u.com Triumph Over Narcissist Abuse
## 2859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (336) 347-4083
## 2860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist, MA  
## 2862                                                                                                                                                                                                                                                                                                                                                                          Whether simple change, or complete transformation, a personal goal of becoming more aware, resolving inner conflict, committing to personal therapy is a significant step in the direction of accomplishing your goal. Therapy with Jamie is a sacred space. A space where your comfort and vulnerability are prioritized to achieve maximum safety to explore thoughts, feelings, actions, and patterns. I am passionate about working in partnership with individuals, families and couples that yearn for improved communication, healthier coping skills, and strengthening personal relationships.
## 2863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 388-2998
## 2864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Psychologist, MA, PhD  
## 2866                                                                                                                                                                                                                                                                                                                     Have you struggled to feel safe, seen, and heard with a mental health professional? Have you ever felt not good enough despite your achievements?  Or felt like you are an imposter—that you are just fooling people?  Ever feel tired and unmotivated but unable to turn off your thoughts? Let me help. Healing outcomes for my clients have included: freeing themselves from their inner critic, increasing their self-trust and confidence, increasing their "response-ability" -- ability to feel and respond (not react) to their life, enlarging their capacity to self-nurture, increasing resilience & discovering passion/meaning in their lives.
## 2867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (407) 305-3425
## 2868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Not Currently Accepting New Clients. Hello!  As someone with lived experience with OCD, I am passionate about helping others through the anxiety and fear that overwhelms and grips us. My OCD developed during my perinatal period, a few short months after I gave birth to my son. For any parent, having those scary and intrusive thoughts can be terrifying.
## 2871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 376-5589
## 2872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 2874                                                                                                                                                                                                                                                                                                                           I have current availability for families, couples, and underage minors.  My goal is to assist individuals struggling with trauma, PTSD, depression,  racism, families of persons with mental illness and family/couples therapy.  The challenges you face are not as important as the tools you need to navigate them.  The role I choose as a therapist is to walk with you on your journey to healing, helping you discover the tools that work for you, teaching you to use them, and celebrating you in your journey.   I honor the differences and diversities in us all, and do not believe in using a 'cookie-cutter' approach with my clients.
## 2875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 361-4203
## 2876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, DSW, LCSW  
## 2878                                                                                                                                                                                                                                                                                                                                                                                     Looking for the freedom of not being judged? Stressed, anxious, or feeling overwhelmed? Stop struggling with life's challenges and let therapy help you begin to thrive. Therapy is proactive self-care and is for anyone who wants a better quality of life. Does your anxiety just seem to take over your life? Does your relationship with money need to be improved to help you make better financial decisions? Or would you like to address lifestyle management issues that affect your whole-person health? My specialties are anxiety, financial wellness, and integrative health. 
## 2879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 688-5156
## 2880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2882                                                                                                                                                                                                                                                                                                                       Do you ever feel broken? Has tragedy taken your ability to feel joy? Has anxiety stolen your peace of mind? Has trauma robbed you of the resiliency you once possessed? Have the dynamics in your relationships grown from compassionate & communicative to conflictual & constricted? Has your identity been tested, oppressed, or discriminated against? If so, then your overall sense of wellness and effectiveness in your life may be wavering. I believe our most optimum level of wholeness is related to the degree of wellness across all areas of life that make us who we are—individual, relational, mental, emotional, spiritual, societal. 
## 2883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 314-6615
## 2884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       The concept of "self-improvement" can be empowering, but also intimidating. In a problem-saturated world, it can be easy to define ourselves as our problems, instead of looking at them as operating forces that can then be explored.   
## 2887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 293-4859
## 2888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Hello and Welcome. Our agency offers affordable telehealth therapy. We are dedicated to decreasing depression, anxiety, trauma, and relationship issues while increasing happiness, love, and resiliency. We provide individual therapy, couples therapy and group therapy.
## 2891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 293-1151
## 2892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 2894                                                                                                                                                                                                                                                                                                                   NOT ACCEPTING NEW CLIENTS ** With empathy and openness, I help clients live in more authentic ways. I focus on a client's internal motivations for change in order to address what may NOT be working well for them, or to strengthen and maintain what may be working well enough. Clients who work with me in couple's/family counseling, experience me as affirming, fair, balanced, reflective and interactive as needed. I am here to help clients identify and reclaim their core values and find healthy ways to live out those values, in order to enhance client health, wellness and success.  Ebook: unbaitable-u.com Triumph Over Narcissist Abuse
## 2895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (336) 347-4083
## 2896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Marriage & Family Therapist, DBA, LMFT  
## 2898                                                                                                                                                                                                                                                                                                                      People search for therapy for various reasons. Most often these reasons include feelings of sadness, experiencing difficulties adjusting to life changes, difficulties dealing with chronic physical pain, emotional pain, trauma, depression, anger, stress and anxieties. Perhaps you are trying to heal from a difficult relationship breakup, leaving you feeling sad and defeated. It could be that you are a part of a newly formed blended family, living together for the first time, and instead of joy you are experiencing chaos. You may be seeking help, because your spouse has received orders for yet another deployment with the military.
## 2899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 432-4230
## 2900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, PhD, LCSW  
## 2902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    In my 30+ years of experience, I have tried to create a non-judgmental environment of openness and collaboration with my clients. I have found that most people are looking for understanding, clarification and a path to hope and healing. 
## 2903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 387-3831
## 2904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2906                                                                                                                                                                                                                                                                                                                                My mission is to empower you to achieve your most fulfilling life. I provide client-centered & trauma-informed services to adults, adolescents, couples, families & teams. If you are struggling with sadness, worry, anger, intrusive thoughts, loneliness, chronic pain, career or work/life balance issues, or family or relational challenges, I can provide support. Our work together will be collaborative & will focus on achieving your individual goals. You will develop further awareness of your barriers & strengths, & learn & rehearse new skills toward increasing satisfaction, success, & connection with yourself and others.
## 2907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (747) 269-1410
## 2908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 2910                                                                                                                                                                                                                                                                                                                  Your best therapist is a witness to your life. Your hope is that if your pain and struggle is seen by another, so will your desires, resilience, and resourcefulness. My place in your therapy is to see you, hear you, and reflect your power back to you. Sharing your journey lets me witness your transformations, big and small. I see and ask: How has systemic oppression affected you, your family, and your communities? I work with Clients anywhere on the spectrums of gender/sexuality, (non)religion, ability, and cultural & racial identity; who express body and sex positivity everywhere from asexual to kink…monogamous to poly…and beyond.
## 2911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 498-3762
## 2912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               Are you experiencing depression, anxiety, phase-of-life issues, marital conflict, family dysfunction, job stress? Are you interested in learning ways to find relief and create changes that lead to greater peace and balance in mental and emotional functioning in your personal, family and relationship life?
## 2915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 918-5771
## 2916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 2918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Today's world demands so much of us. The pressures to be everything, do everything, for everyone can cause stress, anxiety, and depression. We are human. And even the best of humans need support from time to time to bounce back from the challenges of life and live powerfully. It is time that you had a consistent partnership that focuses on your healing, growth, and emotional resilience.
## 2919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 790-7115
## 2920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 2922                                                                                                                                                                                                                                                                                                                                                                                         Anchored in a strengths-based model, my online therapeutic services are for people like you and me. Some are struggling with a specific issue they can’t seem to solve on their own, while others are seeking to improve a skill or process an old unhealed wound.  Utilizing a collaborative strengths-based model my objective is to help you identify & release the negative patterns that have you trapped in a cycle of unfulfilled living. Trauma and stress can rob you of the best parts of yourself, my goal is to help you recover your gifts, and regain your fulfilled Life.
## 2923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 929-9725
## 2924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 2926                                                                                                                                                                                                                                                                                                                                                                                                               My role as a therapist is to help you gain power over the direction of your life. Do you want to set a solid foundation for your relationship? Let's do it. Are you looking for a more meaningful relationship? Let's see what that looks like for YOU. Are you feeling weighed down and unable to move forward? Lets see where that's coming from and get you to where you want to be. There is no better time to invest in yourself than now. I'm here to support you to your next stage of change.  It's like personal (physical) training, but for your mind. 
## 2927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (916) 264-9099
## 2928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Psychologist, PsyD, PhD  
## 2930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Founded in 1993, Help Therapy has a team of over 50 licensed neuropsychologists and psychologists who offer a wide range of psychological evaluations. For patients who need extra support, therapy is also offered. Patients are matched to a provider of their choice based on their specific needs and preferences. Clinicians work with seniors, adults and youth (age 7+) all throughout California.
## 2931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 492-4586
## 2932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Psychologist, MA, PhD  
## 2934                                                                                                                                                                                                                                                                                                                     Have you struggled to feel safe, seen, and heard with a mental health professional? Have you ever felt not good enough despite your achievements?  Or felt like you are an imposter—that you are just fooling people?  Ever feel tired and unmotivated but unable to turn off your thoughts? Let me help. Healing outcomes for my clients have included: freeing themselves from their inner critic, increasing their self-trust and confidence, increasing their "response-ability" -- ability to feel and respond (not react) to their life, enlarging their capacity to self-nurture, increasing resilience & discovering passion/meaning in their lives.
## 2935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (407) 305-3425
## 2936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Clinical Social Work/Therapist, LCSW, C-DBT  
## 2938                                                                                                                                                                                                                                                                                                                                                                                              Do you find yourself struggling with Anxiety, Depression, gender or sexual identity, grief/loss, or acute/chronic medical illness?  The desire to feel better about ourselves is a part of our intrinsic being.  I can be there as a support and sounding board for you, your loved ones & family.  With the goal of accepting your perfectly imperfect self, we can work effectively with each other to find your joy, or at the very least, how to make it through each day to the next.  Discovering that you are deserving and important can be life changing and attainable.  
## 2939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 349-4574
## 2940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Marriage & Family Therapist, MA, MAE  
## 2942                                                                                                                                                                                                                                                                                                                                                                                                       Whatever your unique experience is that brought you to seek therapy, I know it has taken multiple attempts and a whole lot of courage.  We all desire to be seen and affirmed in our journey to uncover our authentic self(s). It may feel as if there just isn't enough room to allow your whole self to show up, and this creates anxiety and/or depression. Regardless if we are aware of the negative external messages we get, some still seem to find their way into our internal world, and it takes work, support, and self-compassion to confront those messages.
## 2943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 344-0302
## 2944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Psychologist  
## 2946                                                                                                                                                                                                                                                                                                                                                                                                                                                             Perhaps you are struggling. You feel down, lonely, unsatisfied, and the person you are doesn’t make you happy. Maybe you’re searching for more meaning, honesty, and truth in the way you live. Perhaps you're finding it hard to maintain healthy and satisfying relationships with the people around you. No matter what is going on, therapy with us will help you find ways to work through your problems together: to understand them deeply, to challenge them constructively, and to move forward peacefully.
## 2947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 584-7159
## 2948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Daniela Yanet Alvarado is a licensed Clinical Social Worker based in Huntington Park, California. Known for her inclusive and community-focused therapy approaches, Daniela blends evidence-based practices with culturally compassionate therapies that serve people of color.
## 2951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 827-8054
## 2952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2954                                                                                                                                                                                                                                                                                                                                                                                               I have years of experience working with trauma, anxiety, depression, grief, and difficult life transitions. Whether you are looking to heal from pain from the past or trying to find a way to move forward in your life, you don’t have to go through it alone. I strive to create a safe, non-judgmental relationship where individuals feel validated and empowered to overcome life’s challenges and lead a more fulfilling life. My approach is person-centered and one of collaborative self-exploration where I see myself as a guide to help you get where you want to be.
## 2955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 496-8473
## 2956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2958                                                                                                                                                                                                                                                                                                                  You’re feeling worried, stressed, and overwhelmed with the day-to-day hustle of life, and you feel like you carry the weight of the world on your shoulders. You look like you've got it all together on the outside, but you’re struggling to feel like you’re enough on the inside. You're trying your best to hold it together, but you’re exhausted. It feels like no matter what you do, life still feels all over the place. You're ready to press the pause button and tend to yourself - to get to know how you feel, to think about what you want, and to make choices that serve your well-being. You're ready to make some changes but not sure how.
## 2959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 336-5187
## 2960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 2962                                                                                                                                                                                                                                                                                                                                                                                         Anchored in a strengths-based model, my online therapeutic services are for people like you and me. Some are struggling with a specific issue they can’t seem to solve on their own, while others are seeking to improve a skill or process an old unhealed wound.  Utilizing a collaborative strengths-based model my objective is to help you identify & release the negative patterns that have you trapped in a cycle of unfulfilled living. Trauma and stress can rob you of the best parts of yourself, my goal is to help you recover your gifts, and regain your fulfilled Life.
## 2963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 929-9725
## 2964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Counselor, MS, LPC-S, LPCC, CST  
## 2966                                                                                                                                                                                                                                                                                                                                                                                                                                           Are you letting everyday life stress you out? Are you experiencing challenges with your interpersonal relationships? Do you miss the intimacy in your relationship? These are just a few examples of the topics that counseling can help you address. I offer evening appointments to allow counseling to fit into your busy schedule without causing additional stress. I create a safe and secure environment to facilitate growth in your personal or professional life. Counseling can be an enriching experience for most people.
## 2967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (254) 232-5816
## 2968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Are you feeling stuck and needing a change? Tired of experiencing restlessness due to the worries? Whether you're going through a sudden unexpected event or you're looking to revisit old habits that are no longer serving you, I'm here to help. I am a compassionate, warm, genuine, and caring professional who honors the entire spectrum of the human experience. I believe in creating a non-judgmental, safe, and authentic therapeutic relationship to support healing.
## 2971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 873-4588
## 2972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 2974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    I specialize in working with women from all walks of life. Sometimes we need a listening ear, other times we need more. I utilize evidence-based interventions with a humanist lens to support my clients with working through the ups and downs of life. I listen with a non-judgmental ear, and cultivate safety and trust in the therapeutic relationship.
## 2975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (510) 298-3842
## 2976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 2978                                                                                                                                                                                                                                                                                                                  You have to feel better to get better. That may seem obvious, but it really isn't. When I begin to work with a new patient, I have two immediate goals: To get to know this person so we can determine if we're a good match; and if we are, to use my years of experience and skills to target current areas of damage and hurt. People come to therapy in pain — something or many things in their lives aren't working. Our job is to take a breath, appreciate your unique situation, understand when and how current problem(s) became unmanageable or toxic, and then find ways to feel better, more hopeful and clear about how to proceed back to life.
## 2979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 862-6371
## 2980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Psychologist  
## 2982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    As a Therapy practice we love to help everyone! no matter what the situation is, our purpose is to help anyone struggling during these times!
## 2983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (949) 989-5476
## 2984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Psychologist  
## 2986                                                                                                                                                                                                                                                                                                                                                                                                                    Valley Community Counseling Clinic offers in-depth and affordable psychotherapy. We have provided quality treatment in the San Fernando Valley for 47 years. Our clinic serves as one of the most reputable training sites for psychotherapists in Los Angeles county. All of our therapists are working toward licensure and are under the supervision of licensed therapists, psychologists and psychoanalysts. We do not limit the number of sessions you may attend. We offer treatment on a sliding scale based on your income and your ability to pay. 
## 2987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 722-8711
## 2988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist Associate, AMFT  
## 2990                                                                                                                                                                                                                                                                                                                     Are you or your child struggling with anxiety, depression, or behavioral issues? Have you found yourself feeling stuck or unable to create change? Therapy can help you cope with these challenges and set you up for future success. I find a positive and trusting client-therapist relationship to be the most essential component of the therapeutic process and place an emphasis on creating a safe and non-judgmental space for effective reflection and growth. Incorporating humanistic, mindfulness, and strengths-based approaches, I work with anxiety, depression, self-esteem, oppositional defiance, high-risk behavior, and family dynamics.
## 2991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 233-1039
## 2992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 2994                                                                                                                                                                                                                                                                                                                                                                                              You are a complex being. You've had painful life experiences that continue to impact you even though you don't want them to. You may find yourself feeling stuck, reacting in ways that don't make sense, and reliving past experiences over and over in your thoughts or even in your dreams. Fear comes out of nowhere, and it is exhausting being on guard all the time. It may feel like you can't trust anyone, sometimes not even yourself. But healing is possible. You deserve joy, peace, and deep healing. When you heal, you heal the generations before and after you. 
## 2995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 222-5205
## 2996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 2997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 2998                                                                                                                                                                                                                                                                                                                                                             Do you feel stuck and find it difficult to move past deeply hurt feelings and inescapable sadness? Are you feeling unheard or misunderstood? Have you been irritable, frustrated, or avoidant of important tasks and increased feelings of overwhelm? You may be suffering from symptoms related to anxiety, PTSD, or trauma responses. You can live the life you deserve and I would love to be the therapist to help you. Type of Therapy: Interpersonal, Coaching, Mindfulness-Based (MBCT), Strength-Based, Solution Focused Brief (SFBT), Cognitive Behavioral Therapy, Family Systems, EMDR Trained Therapist.
## 2999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (951) 547-0024
## 3000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           PsyD  
## 3002                                                                                                                                                                                                                                                                                                                                                                                                        Tired of having to retell your story over and over to different therapists and still not feel you’ve made a good match? Are you frequently anxious, down, or experience low motivation? Do you engage in self-talk or hold beliefs that cause you unhappiness? Sessions will identify and validate the core issues that keep you stuck. Together we will create realistic goals and customized plans while building on your strengths. We will identify and defuse the roadblocks that are holding you back. Contact me via phone or email. I am looking forward to help.
## 3003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (646) 328-6074
## 3004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 3006                                                                                                                                                                                                                                                                                                                                                     What season of your personal and/or love life are you in?  Are you in spring- full of hope and anticipation, summer- relaxed and enjoying life, fall- grappling with uncertainty, or winter- discouraged and disconnected?  Unresolved or unaddressed grief and conflict can rob us of the ability to live life fully. Have you experienced disconnection in your relationship, breakup, divorce, loss of a loved one, health decline/medical issues, aging; or change associated with a move, new job, or COVID that is causing stress, anxiety, or depression? I can help you find inner peace while weathering the storm.
## 3007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 3008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist, DHS, PCC, LMFT  
## 3010                                                                                                                                                                                                                                                                                                                                                                                                                                                        In working together, I will help you identify themes and patterns of feeling and thinking that create barriers to having healthy relationships and preventing you from living life to your fullest potential.  I emphasize meeting you where you are at and expanding in ways that are attuned to your needs and your experiences in your social context. I aim for a therapeutic relationship that allows for an experience of respect and equal engagement that is crucial to the foundation of change and exploration.
## 3011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (415) 475-0966
## 3012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Clinical Social Work/Therapist, LCSW, EMDR-T  
## 3014                                                                                                                                                                                                                                                                                                                                                            Self-exploration is probably the most challenging but highly rewarding journey you can take in your life. The narrative you hold about yourself is based on your lived experiences. It's a combination of controlled and uncontrolled events. It's often the uncontrolled events/experiences in your life that take a gripping hold, disempower you, frighten you and disable your ability to function.  Getting control of your circumstances is truly liberating. Reaching that freedom of choice takes courage, perseverance, resilience and grit. Let’s access all of those strengths within you and get started.
## 3015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 325-0667
## 3016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 3018                                                                                                                                                                                                                                                                                                                                                                    Seeking out therapy can be a difficult choice to make. It may also mean that you are ready to make some changes in your life. Perhaps you are feeling overwhelmed or stuck due to a stressful life event. Maybe you want to further explore some of your underlying issues or traumas. I have experience working with adolescents and adults struggling with anxiety, depression, family conflict, issues with self-esteem, and life transitions. Together, we can explore how your current choices may be connected with your past experiences or how your thoughts, feelings and behaviors are interlinked.
## 3019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 352-1816
## 3020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, LCSW, CHT  
## 3022                                                                                                                                                                                                                                                                                                                                            I am a licensed psychotherapist and certified hypnotherapist with 20+ years of experience in the mental health field. I work with women who experience anxiety, depression, post-traumatic stress, grief and loss, relationship challenges, and a host of other concerns. Additionally,  I work with women and couples who are experiencing infertility. I also offer interactive and engaging group sessions for women struggling with infertility. I am a passionate and empathetic clinician committed to helping individuals and couples achieve their dream of parenthood due to my own personal struggles with infertility.  ​  
## 3023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (628) 262-2567
## 3024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Psychologist, PhD, NCC  
## 3026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      No one ever said it (life, relationships, career, school) would be easy but should it be this hard? Taking the first step to explore therapy can be challenging but it can be helpful to obtain support during times of transition or difficulty. If you are still unsure, or even if you are familiar with the therapeutic process, meeting me and getting more information about how I work just takes one session, and a consultation costs you nothing.
## 3027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 3028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Counselor, MA, LPCC+  
## 3030                                                                                                                                                                                                                                                                                                                                                                                        Life is complicated, each person has a unique journey with various obstacles and challenges. Think of therapy as your road map to support you in getting to your desired destination. Whether you need support in overcoming past traumas, having difficulty adjusting, need career counseling, support in strengthening your relationships or more, Suzzette would be honored to be your therapist.  Suzzette’s goal is to empower individuals to meet their full potential through the integration of wellness and mentorship programs in schools, communities and corporate settings. 
## 3031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (650) 374-0084
## 3032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 3034                                                                                                                                                                                                                                                                                                                           As a professional of color and daughter of immigrant parents, my passion is to connect, strengthen, and empower communities of color to healing and resiliency in a culturally attuned and compassionate therapeutic process.  I believe therapy is a collaborative process between patient and therapist. I have extensive experience working with adolescence, adults, parents, couples, and families developing and maintaining, healthy and fulfilling relationships. My services are offered in English and Spanish and through telehealth. I seek to create a warm, attentive environment, to nurture an opportunity for therapeutic connection.
## 3035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 322-6481
## 3036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 3038                                                                                                                                                                                                                                                                                                                             Are you someone who is struggling with relationships, anger issues, substance use, depression, and/or anxiety and need support now? Then you have already taken the first step to achieving a better life for yourself! Most people's intention is to live a happier, healthier, more peaceful life. You can do this! Build your self esteem and  receive assertiveness training, anger management, and mindfulness strategies that enhance your life in order to better cope and be stress free. Nicholle Lovely, LMFT is a Licensed Marriage and Family Therapist who is here to support you with alleviating dis-ease and living your best life! 
## 3039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 3040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 3042                                                                                                                                                                                                                                                                                                                           As a professional of color and daughter of immigrant parents, my passion is to connect, strengthen, and empower communities of color to healing and resiliency in a culturally attuned and compassionate therapeutic process.  I believe therapy is a collaborative process between patient and therapist. I have extensive experience working with adolescence, adults, parents, couples, and families developing and maintaining, healthy and fulfilling relationships. My services are offered in English and Spanish and through telehealth. I seek to create a warm, attentive environment, to nurture an opportunity for therapeutic connection.
## 3043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 322-6481
## 3044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MA, AMFT  
## 3046                                                                                                                                                                                                                                                                                                                                               I am currently accepting new clients. Are you ready to navigate what's keeping you blocked, robbing you of fulfillment and peace? Perhaps you're confused and unsure about therapy yet curious, feeling an innate desire for change. I am glad you landed on my profile, and if you would like to take a courageous step toward healing, I would feel honored to assist you on your journey.  I foster space for clients that feels anchored, contained, and warm. My unique style as a healer is integrative and empathic, yet will challenge you. I am trained in EMDR and have helped clients successfully clear their traumas.
## 3047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 301-7902
## 3048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Counselor, MA, LPCC+  
## 3050                                                                                                                                                                                                                                                                                                                                                                                        Life is complicated, each person has a unique journey with various obstacles and challenges. Think of therapy as your road map to support you in getting to your desired destination. Whether you need support in overcoming past traumas, having difficulty adjusting, need career counseling, support in strengthening your relationships or more, Suzzette would be honored to be your therapist.  Suzzette’s goal is to empower individuals to meet their full potential through the integration of wellness and mentorship programs in schools, communities and corporate settings. 
## 3051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (650) 374-0084
## 3052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 3054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Worries and sadness can be overwhelming.  Imagine it's your child who is struggling with getting to school, overwhelmed with educational expectations, frustrated with social pressures or discouraged with parental discord.  These are some of the various challenges we help children and adolescents manage.  We are trained to work with children and adolescents using evidence-based treatment models to manage behaviors and teach new skills.   
## 3055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 870-6351
## 3056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 3058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Are you feeling stuck and needing a change? Tired of experiencing restlessness due to the worries? Whether you're going through a sudden unexpected event or you're looking to revisit old habits that are no longer serving you, I'm here to help. I am a compassionate, warm, genuine, and caring professional who honors the entire spectrum of the human experience. I believe in creating a non-judgmental, safe, and authentic therapeutic relationship to support healing.
## 3059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 873-4588
## 3060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist Associate, AMFT  
## 3062                                                                                                                                                                                                                                                                                                                     Are you or your child struggling with anxiety, depression, or behavioral issues? Have you found yourself feeling stuck or unable to create change? Therapy can help you cope with these challenges and set you up for future success. I find a positive and trusting client-therapist relationship to be the most essential component of the therapeutic process and place an emphasis on creating a safe and non-judgmental space for effective reflection and growth. Incorporating humanistic, mindfulness, and strengths-based approaches, I work with anxiety, depression, self-esteem, oppositional defiance, high-risk behavior, and family dynamics.
## 3063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 233-1039
## 3064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   Psychologist  
## 3066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    As a Therapy practice we love to help everyone! no matter what the situation is, our purpose is to help anyone struggling during these times!
## 3067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (949) 989-5476
## 3068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Psychologist, MEd, PhD  
## 3070                                                                                                                                                                                                                                                                                                                                Be True To You! I’m a generalist psychologist working with a lot of different concerns with a special niche in working with creative performers and entertainers! Are you a passionate, creative, business-minded, diligent, performer, entrepreneur, or want to explore your identity and potential to be more?  True To You Psychotherapy & Consulting provides services for performers including those who are or aspiring to be entertainers, executives, athletes, first-responders, performers, etc.  Services include individual, couples or group therapy and consulting, workshops, team building, life coaching, and movement therapy. 
## 3071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 918-4766
## 3072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 3074                                                                                                                                                                                                                                                                                                                             Are you someone who is struggling with relationships, anger issues, substance use, depression, and/or anxiety and need support now? Then you have already taken the first step to achieving a better life for yourself! Most people's intention is to live a happier, healthier, more peaceful life. You can do this! Build your self esteem and  receive assertiveness training, anger management, and mindfulness strategies that enhance your life in order to better cope and be stress free. Nicholle Lovely, LMFT is a Licensed Marriage and Family Therapist who is here to support you with alleviating dis-ease and living your best life! 
## 3075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 3076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Psychologist, PhD  
## 3078                                                                                                                                                                                                                                                                                                                  You have to feel better to get better. That may seem obvious, but it really isn't. When I begin to work with a new patient, I have two immediate goals: To get to know this person so we can determine if we're a good match; and if we are, to use my years of experience and skills to target current areas of damage and hurt. People come to therapy in pain — something or many things in their lives aren't working. Our job is to take a breath, appreciate your unique situation, understand when and how current problem(s) became unmanageable or toxic, and then find ways to feel better, more hopeful and clear about how to proceed back to life.
## 3079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 862-6371
## 3080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 3082                                                                                                                                                                                                                                                                                                                                                                                                                              What does your path to success look like?  In our work together, we will address your self-doubt, anxiety and stress when facing barriers to success by strategizing a realistic plan that fits your lifestyle and creating a system of accountability for continuous success. We will navigate marginalization + microaggressions due to race, gender, sexual orientation and more   through trauma-informed, culturally-aware individual and group coaching and mentoring sessions so you can set and achieve goals that are meaningful for you. 
## 3083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (833) 536-0670
## 3084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            Counselor, MS, LPCC  
## 3086                                                                                                                                                                                                                                                                                                                                                        You may choose therapy for multiple reasons. Whether you are here to resolve relationship conflicts, life transition, loss, trauma, or to manage stressors with work; taking this first step can be quite challenging as well as rewarding. Experiencing life's conflicts are often the most demanding aspect of our daily lives; problems often become bigger when you try to ignore them. My goal is to provide guidance for you to find your inner strength to enjoy life again. Together, we will work through your vulnerabilities, fears, and beliefs to have a better understanding of how things can be improved.
## 3087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (909) 359-7905
## 3088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      Clinical Social Work/Therapist, MSW, LCSW  
## 3090                                                                                                                                                                                                                                                                                                                                                                                                                                                           I am interested in helping you reduce symptoms of distress. These symptoms often feel like being on the edge, sudden panic, running thoughts,  sadness, worry, difficulty sleeping, or sleeping too much. It can also feel like feeling lost, misunderstood and easily distracted. My approach is to create an environment where you feel understood, seen, and heard. We can explore your struggles, feelings, thoughts, and guide you to examine your experiences with the goal of improving your quality of life.  
## 3091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 701-0548
## 3092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 3094                                                                                                                                                                                                                                                                                                                                                            If you are questioning your reality for any reason, I’d like to help you find your internal compass and help you understand what is driving you.  Life is a series of obstacles and accomplishments.   I enjoy helping people uncover their true nature and discover their needs.   When we recognize our needs, we begin to come alive!  As one develops boundaries to protect their needs relationships become easier.  When we know ourselves, we can hold relationships with others more comfortably.   I want to help you develop a life of satisfaction and joy, in relationship with both yourself and others.
## 3095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (831) 777-4189
## 3096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 3098                                                                                                                                                                                                                                                                                                                                                I specialize in Child and Adolescent therapy, as well as Individual, and Family therapy. My focus is to assist with personal growth and address concerns such as loss and grief, anxiety, and depression. I take pride in providing a safe and nurturing environment where individuals who identify as QTPOC, POC, and/or LGBTQ, feel seen and heard where the focus is on their healing and success. My goal is to help one discover resiliency and begin the journey to  healing and overcoming barriers. Through empowerment and support I want to help you discover what is best for you, being your true and authentic self.
## 3099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (562) 392-8941
## 3100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 3102                                                                                                                                                                                                                                                                                                                                              *Virtual for all CA, in-person office opening soon in Palm Springs, CA*   I hope to meet you where you are and journey with you towards your therapeutic goals. Are you wanting to change unhealthy life patterns? Are you stressed or dealing with the effects of anger or anxiety? Maybe life is just really tough right now. Let us sit together and discover new ways of coping based on your strengths and write the story of "you" that you prefer. Your personal story matters and I strive to be aware and considerate of the ways every-day life intersects with who YOU are, and work with you towards life satisfaction.
## 3103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (415) 582-6309
## 3104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 3106                                                                                                                                                                                                                                                                                                                                                                                                                                                                        Note: I am not currently able to see clients with Tricare insurance.                                    I think therapy should be challenging yet fun and lighthearted. I value efficiency in getting to heart of things, while honoring your pace. We will look at the present and the past as we assess what is and isn't working in your life. I will get to know you and when you feel truly heard and known, we will make a plan for how the best version of your self can emerge in every day life.
## 3107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 294-0200
## 3108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 3110                                                                                                                                                                                                                                                                                                                                                                                                                                         Therapy can be a very scary process.  From having to call one to having your first meeting and then doing the work.  This is especially so when you are facing difficult times or remembering events that you've struggled with for some time and realize that this is what is holding us back to our fullest expression.   In our work together, I will bring nurturance and support as we explore the underlying causes to what brings you distress.  I will provide you with a  safe, non-judgmental environment to explore freely.  
## 3111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 340-1891
## 3112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MS, LMFT  
## 3114                                                                                                                                                                                                                                                                                                                                                               Life can be very challenging and overwhelming at times.  We all experience pain, hurt, loss, and many of us carry deep wounds that may be causing issues in our daily lives.  It is part of human nature to get stuck in our thoughts from time to time, mulling over different scenarios, or feeling stuck and unable to make a decision.  It is also part of our nature to seek healing, connection, and wholeness.  Therapy can be your space to connect, seek guidance, discuss things on your mind, navigate through confusing times, confront challenges, grow and find more peace and balance in your life.
## 3115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (626) 624-5634
## 3116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 3118                                                                                                                                                                                                                                                                                                                                                                                                                             I have designed a practice that recognizes diverse paths to family. Because I believe each journey is unique. I respect what you have experienced and will help you discover and reach​ your goals. This mindful approach allows me to bring an open mind and heart to each situation. I offer Counseling, Education and Consultation services in the area of Family Formation, specializing in the area of Adoption. I provide counseling to pre-adoptive and adoptive parents, expectant/birth parents, and adoptees, covering an array of topics. 
## 3119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (415) 993-6226
## 3120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 3122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  Being here means that you’re on the quest to creating a stronger, healthier, and happier version of yourself. If you’re struggling with feeling stuck, insecure, off-centered, know there is an alternative that is possible - one where you’re able to understand and overcome old patterns that have kept you in stagnation. There is the possibility for a lighter and brighter you, one in which you are grounded, connected, and inspired.
## 3123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 312-3660
## 3124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 3126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Hi there! I'm a Licensed Marriage and Family Therapist specializing in gender and sexuality.  I've been doing this work for more than ten years and enjoy it immensely. I value deep connection and enjoy helping people make positive changes in their lives. ​ Some of my areas of interest include: intersectional identity, anxiety, relational issues, and ADHD.
## 3127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (714) 589-2391
## 3128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 3130                                                                                                                                                                                                                                                                                                                                                                                                                             I have designed a practice that recognizes diverse paths to family. Because I believe each journey is unique. I respect what you have experienced and will help you discover and reach​ your goals. This mindful approach allows me to bring an open mind and heart to each situation. I offer Counseling, Education and Consultation services in the area of Family Formation, specializing in the area of Adoption. I provide counseling to pre-adoptive and adoptive parents, expectant/birth parents, and adoptees, covering an array of topics. 
## 3131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (415) 993-6226
## 3132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Marriage & Family Therapist Associate, MS, AMFT  
## 3134                                                                                                                                                                                                                                                                                                                     I work collaboratively with clients to create a comfortable and authentic environment to open up a safe space for a rich and productive experience. I enjoy helping biracial couples who might be struggling with cultural blending, as well as couples who are finding & building their identity as a couple. I've been successful working with adults who are experiencing depression, anxiety, life stress, relationship/family conflict, self-esteem issues, & C-PTSD. I also work with teens experiencing grief and other losses. I am especially passionate about working with the BIPOC community and anyone who identifies as a child of immigrants!
## 3135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 296-6876
## 3136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           Clinical Social Work/Therapist, LCSW  
## 3138                                                                                                                                                                                                                                                                                                                                                                           You’ve excelled in so many ways, but you're exhausted. The perfectionist in you never lets you forget when you’ve seemingly missed the mark. In friendships and romantic relationships, you wish there was a guide on how to finally get things “right”. What makes you really productive at work or school, also makes it hard for you to rest in your personal life. The fear of not being “good enough", cause you to overanalyze everything. It feels hard to stop the wheels from turning, so you become stuck in your head and withdrawn from the life and relationships that you actually want.
## 3139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (510) 573-7745
## 3140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Marriage & Family Therapist, LMFT, CMHIMP, RYT-200  
## 3142                                                                                                                                                                                                                                                                                                                   How hard is it for you to create balance and focus in a world full of distractions, dishonesty, & dis-ease? And if what I call the "detrimental D's" as stated above contributes to how you act/think/feel, then who or what is really controlling your life & wellbeing? Let me guess: social media, unaddressed trauma, grief & loss, emotional dysregulation, unhealthy boundaries, passiveness, impulsivity, mood or eating disorders, chronic fatigue, aches/pain, anxiety, depression, digestive discomfort, pH imbalances, etc. Talk therapy alone may be unsuccessful or even unappealing, are you interested in exploring something more effective?  
## 3143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 339-2143
## 3144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LFMT  
## 3146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                I help clients find their freedom. I believe that there is hope in every situation and I am skilled in working with client's who have a hard time believing that they can overcome. I have experience working with anxiety, depression, trauma, communication, and relationships. As a  Christian therapist I believe in a holistic approach to treatment and focus on the physical, spiritual, and emotional needs of a client. 
## 3147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (661) 218-1635
## 3148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 3150                                                                                                                                                                                                                                                                                                                 Now accepting new clients. I'm glad that you've taken the first step toward creating the healthy future that you want for yourself. Situations in life can cause us to feel stressed, and seeking therapy shouldn't be one of those stressors. With some much happening in our personal lives we don't often have the chance to "make space" for ourselves, let me help you. Whether you are struggling with  saying "no", comparing yourself to others, feeling emotionally drained, feeling anxious, depressed, or struggling with past traumas, and/or work-place stress, you've come to the right place. I'm ready to take this journey of healing with you.
## 3151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 351-9436
## 3152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist, MA, LMFT  
## 3154                                                                                                                                                                                                                                                                                                                                                                                                   Life, without a doubt, can be burdensome with its obligations and expectations often leaving us feeling stuck, unheard and alone. Between managing the demands of daily stressors it can feel like we're drowning and we forget to take care of ourselves. Yet, the gift of self expression gives us permission to return the love and energy we give outwardly to ourselves. Using strength-based techniques, I work collaboratively with individuals, couples and families seeking lasting relief from the strife's of “adulting”, anxiety, depression and complex trauma.  
## 3155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (510) 822-8948
## 3156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       MA, LMFT  
## 3158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   At Reconnect, we strive to provide a space in which people feel seen, heard, and included by providing various treatment options and specialties. To meet the needs of our clients, our clinicians can assist clients with changing or modifying undesired behaviors, improve both mood and relationships, deconstructing childhood trauma, assisting children and parents with their concerns, and much more.
## 3159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (818) 619-3835
## 3160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 3162                                                                                                                                                                                                                                                                                                                                                                                                                        I am interested in wellness and holistic approaches to therapy. My work focuses on helping my clients achieve growth. Growth can take many forms in one's life such as: improved relationships, improved sense of self, transition across barriers, achievement of goals, career success, reduction of painful/unwanted symptoms, etc. My approach focuses on understanding the core of suffering and stagnation while uncovering what stands in the way of growth. I now provide Psychedelic Assisted Psychotherapy as a optional compliment to therapy.
## 3163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (619) 768-2034
## 3164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Psychologist, PsyD  
## 3166                                                                                                                                                                                                                                                                                                                               There are many reasons to seek out therapy. The ultimate purpose for considering therapy is often to resolve whatever is in the way of having a better life. \nAs an active, empathic and experienced psychotherapist, my goal is to assist individuals in overcoming the barriers that prevent them from experiencing, the relationships in their lives in a full and rich way. I work to understand each individual's unique struggle, while respecting personal history and cultural background.\nUltimately, I help individuals to see how past experiences and behavioral patterns may contribute to their current symptoms and difficulties.
## 3167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 325-4067
## 3168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Marriage & Family Therapist, LMFT, BCBA, Individ, Couples, Enterta  
## 3170                                                                                                                                                                                                                                                                                                                                                                                                                                                                       Are you looking for a more fulfilling life? In my life coaching and therapy sessions, I am here to guide you to connect with your values, and to experience joy in your life (again). We can focus on topics such as relationships, anxiety, career, depression, ADHD, and Autism. Through convenient Zoom sessions, I create an environment, so you can be yourself, get insight, and gain tools. As an empathic person and mother, I will bring my authentic self and compassion for people to sessions.
## 3171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 270-1773
## 3172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         Associate Clinical Social Worker, ACSW  
## 3174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 3175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 321-8437
## 3176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             Marriage & Family Therapist, LMFT   
## 3178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 3179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 816-7330
## 3180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                Pre-Licensed Professional, ACSW  
## 3182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 3183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 868-2263
## 3184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist Associate  
## 3186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 3187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (424) 331-1709
## 3188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          Marriage & Family Therapist Associate  
## 3190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 3191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (310) 861-6806
## 3192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Marriage & Family Therapist Associate, AMFT  
## 3194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 3195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (213) 652-3970
## 3196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
## 3197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              Marriage & Family Therapist, LMFT  
## 3198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <NA>
## 3199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   (323) 656-3337
## 3200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 
##                               X3
## 1     Los Angeles,   CA   90048 
## 2                       & Online
## 3                           <NA>
## 4                               
## 5     Los Angeles,   CA   90044 
## 6                       & Online
## 7                           <NA>
## 8                               
## 9     Los Angeles,   CA   90008 
## 10                      & Online
## 11                          <NA>
## 12                              
## 13    Los Angeles,   CA   90066 
## 14                          <NA>
## 15     Not accepting new clients
## 16                              
## 17    Los Angeles,   CA   90004 
## 18                      & Online
## 19                          <NA>
## 20                              
## 21    Los Angeles,   CA   90019 
## 22                      & Online
## 23                          <NA>
## 24                              
## 25    Los Angeles,   CA   90025 
## 26                      & Online
## 27                          <NA>
## 28                              
## 29    Los Angeles,   CA   90045 
## 30                      & Online
## 31                          <NA>
## 32                              
## 33    Los Angeles,   CA   90064 
## 34                          <NA>
## 35     Not accepting new clients
## 36                              
## 37    Los Angeles,   CA   90004 
## 38                      & Online
## 39                          <NA>
## 40                              
## 41    Los Angeles,   CA   90015 
## 42                      & Online
## 43                          <NA>
## 44                              
## 45    Los Angeles,   CA   90017 
## 46                      & Online
## 47                          <NA>
## 48                              
## 49    Los Angeles,   CA   90007 
## 50                      & Online
## 51                          <NA>
## 52                              
## 53    Los Angeles,   CA   90017 
## 54                      & Online
## 55                          <NA>
## 56                              
## 57    Los Angeles,   CA   90002 
## 58                      & Online
## 59                          <NA>
## 60                              
## 61    Los Angeles,   CA   90066 
## 62                      & Online
## 63                          <NA>
## 64                              
## 65    Los Angeles,   CA   90025 
## 66                      & Online
## 67                          <NA>
## 68                              
## 69    Los Angeles,   CA   90034 
## 70                      & Online
## 71                          <NA>
## 72                              
## 73    Los Angeles,   CA   90020 
## 74                          <NA>
## 75     Not accepting new clients
## 76                              
## 77    Los Angeles,   CA   90044 
## 78                      & Online
## 79                          <NA>
## 80                              
## 81    Los Angeles,   CA   90015 
## 82                      & Online
## 83                          <NA>
## 84                              
## 85    Los Angeles,   CA   90008 
## 86                      & Online
## 87                          <NA>
## 88                              
## 89    Los Angeles,   CA   90019 
## 90                      & Online
## 91                          <NA>
## 92                              
## 93    Los Angeles,   CA   90025 
## 94                      & Online
## 95                          <NA>
## 96                              
## 97    Los Angeles,   CA   90025 
## 98                      & Online
## 99                          <NA>
## 100                             
## 101   Los Angeles,   CA   90043 
## 102                     & Online
## 103                         <NA>
## 104                             
## 105   Los Angeles,   CA   90034 
## 106                     & Online
## 107                         <NA>
## 108                             
## 109   Los Angeles,   CA   90066 
## 110                     & Online
## 111                         <NA>
## 112                             
## 113   Los Angeles,   CA   90045 
## 114                     & Online
## 115     Waitlist for new clients
## 116                             
## 117   Los Angeles,   CA   90044 
## 118                     & Online
## 119                         <NA>
## 120                             
## 121   Los Angeles,   CA   90045 
## 122                     & Online
## 123                         <NA>
## 124                             
## 125   Los Angeles,   CA   90094 
## 126                     & Online
## 127                         <NA>
## 128                             
## 129   Los Angeles,   CA   90025 
## 130                     & Online
## 131                         <NA>
## 132                             
## 133   Los Angeles,   CA   90001 
## 134                     & Online
## 135                         <NA>
## 136                             
## 137   Los Angeles,   CA   90056 
## 138                     & Online
## 139                         <NA>
## 140                             
## 141   Los Angeles,   CA   90005 
## 142                     & Online
## 143                         <NA>
## 144                             
## 145   Los Angeles,   CA   90015 
## 146                     & Online
## 147                         <NA>
## 148                             
## 149   Los Angeles,   CA   90045 
## 150                         <NA>
## 151    Not accepting new clients
## 152                             
## 153   Los Angeles,   CA   90005 
## 154                     & Online
## 155                         <NA>
## 156                             
## 157   Los Angeles,   CA   90008 
## 158                     & Online
## 159                         <NA>
## 160                             
## 161   Los Angeles,   CA   90045 
## 162                         <NA>
## 163    Not accepting new clients
## 164                             
## 165   Los Angeles,   CA   90078 
## 166                     & Online
## 167                         <NA>
## 168                             
## 169   Los Angeles,   CA   90045 
## 170                     & Online
## 171     Waitlist for new clients
## 172                             
## 173   Los Angeles,   CA   90028 
## 174                     & Online
## 175                         <NA>
## 176                             
## 177   Los Angeles,   CA   90013 
## 178                     & Online
## 179                         <NA>
## 180                             
## 181   Los Angeles,   CA   90028 
## 182                     & Online
## 183                         <NA>
## 184                             
## 185   Los Angeles,   CA   90056 
## 186                     & Online
## 187     Waitlist for new clients
## 188                             
## 189   Los Angeles,   CA   90066 
## 190                     & Online
## 191                         <NA>
## 192                             
## 193   Los Angeles,   CA   90068 
## 194                         <NA>
## 195    Not accepting new clients
## 196                             
## 197   Los Angeles,   CA   90005 
## 198                     & Online
## 199                         <NA>
## 200                             
## 201   Los Angeles,   CA   90008 
## 202                         <NA>
## 203    Not accepting new clients
## 204                             
## 205   Los Angeles,   CA   90015 
## 206                     & Online
## 207                         <NA>
## 208                             
## 209   Los Angeles,   CA   90024 
## 210                     & Online
## 211                         <NA>
## 212                             
## 213   Los Angeles,   CA   90059 
## 214                     & Online
## 215                         <NA>
## 216                             
## 217   Los Angeles,   CA   90033 
## 218                     & Online
## 219                         <NA>
## 220                             
## 221   Los Angeles,   CA   90024 
## 222                     & Online
## 223                         <NA>
## 224                             
## 225   Los Angeles,   CA   90016 
## 226                     & Online
## 227                         <NA>
## 228                             
## 229   Los Angeles,   CA   90019 
## 230                     & Online
## 231                         <NA>
## 232                             
## 233   Los Angeles,   CA   90012 
## 234                     & Online
## 235                         <NA>
## 236                             
## 237   Los Angeles,   CA   90008 
## 238                     & Online
## 239     Waitlist for new clients
## 240                             
## 241   Los Angeles,   CA   90066 
## 242                         <NA>
## 243    Not accepting new clients
## 244                             
## 245   Los Angeles,   CA   90008 
## 246                         <NA>
## 247    Not accepting new clients
## 248                             
## 249   Los Angeles,   CA   90013 
## 250                     & Online
## 251                         <NA>
## 252                             
## 253   Los Angeles,   CA   90015 
## 254                     & Online
## 255                         <NA>
## 256                             
## 257   Los Angeles,   CA   90066 
## 258                     & Online
## 259                         <NA>
## 260                             
## 261   Los Angeles,   CA   90008 
## 262                     & Online
## 263                         <NA>
## 264                             
## 265   Los Angeles,   CA   90016 
## 266                         <NA>
## 267    Not accepting new clients
## 268                             
## 269   Los Angeles,   CA   90001 
## 270                     & Online
## 271                         <NA>
## 272                             
## 273   Los Angeles,   CA   90003 
## 274                     & Online
## 275                         <NA>
## 276                             
## 277   Los Angeles,   CA   90025 
## 278                         <NA>
## 279    Not accepting new clients
## 280                             
## 281   Los Angeles,   CA   90035 
## 282                     & Online
## 283                         <NA>
## 284                             
## 285   Los Angeles,   CA   90048 
## 286                     & Online
## 287                         <NA>
## 288                             
## 289   Los Angeles,   CA   90034 
## 290                     & Online
## 291                         <NA>
## 292                             
## 293   Los Angeles,   CA   90025 
## 294                     & Online
## 295     Waitlist for new clients
## 296                             
## 297   Los Angeles,   CA   90049 
## 298                         <NA>
## 299    Not accepting new clients
## 300                             
## 301   Los Angeles,   CA   90026 
## 302                     & Online
## 303                         <NA>
## 304                             
## 305   Los Angeles,   CA   90039 
## 306                     & Online
## 307                         <NA>
## 308                             
## 309   Los Angeles,   CA   90017 
## 310                     & Online
## 311                         <NA>
## 312                             
## 313   Los Angeles,   CA   90045 
## 314                     & Online
## 315                         <NA>
## 316                             
## 317   Los Angeles,   CA   90041 
## 318                     & Online
## 319                         <NA>
## 320                             
## 321   Los Angeles,   CA   90010 
## 322                     & Online
## 323                         <NA>
## 324                             
## 325   Los Angeles,   CA   90025 
## 326                     & Online
## 327                         <NA>
## 328                             
## 329   Los Angeles,   CA   90024 
## 330                     & Online
## 331                         <NA>
## 332                             
## 333   Los Angeles,   CA   90045 
## 334                     & Online
## 335                         <NA>
## 336                             
## 337   Los Angeles,   CA   90010 
## 338                     & Online
## 339                         <NA>
## 340                             
## 341   Los Angeles,   CA   90015 
## 342                     & Online
## 343                         <NA>
## 344                             
## 345   Los Angeles,   CA   90045 
## 346                     & Online
## 347                         <NA>
## 348                             
## 349   Los Angeles,   CA   90064 
## 350                     & Online
## 351                         <NA>
## 352                             
## 353   Los Angeles,   CA   90038 
## 354                     & Online
## 355                         <NA>
## 356                             
## 357   Los Angeles,   CA   90066 
## 358                     & Online
## 359                         <NA>
## 360                             
## 361   Los Angeles,   CA   90039 
## 362                     & Online
## 363                         <NA>
## 364                             
## 365   Los Angeles,   CA   90038 
## 366                     & Online
## 367                         <NA>
## 368                             
## 369   Los Angeles,   CA   90035 
## 370                     & Online
## 371                         <NA>
## 372                             
## 373   Los Angeles,   CA   90024 
## 374                     & Online
## 375                         <NA>
## 376                             
## 377   Los Angeles,   CA   90056 
## 378                     & Online
## 379                         <NA>
## 380                             
## 381   Los Angeles,   CA   90048 
## 382                     & Online
## 383                         <NA>
## 384                             
## 385   Los Angeles,   CA   90038 
## 386                     & Online
## 387                         <NA>
## 388                             
## 389   Los Angeles,   CA   90025 
## 390                     & Online
## 391                         <NA>
## 392                             
## 393   Los Angeles,   CA   90017 
## 394                     & Online
## 395                         <NA>
## 396                             
## 397   Los Angeles,   CA   90019 
## 398                     & Online
## 399                         <NA>
## 400                             
## 401   Los Angeles,   CA   90048 
## 402                     & Online
## 403                         <NA>
## 404                             
## 405   Los Angeles,   CA   90027 
## 406                     & Online
## 407                         <NA>
## 408                             
## 409   Los Angeles,   CA   90015 
## 410                     & Online
## 411                         <NA>
## 412                             
## 413   Los Angeles,   CA   90019 
## 414                     & Online
## 415                         <NA>
## 416                             
## 417   Los Angeles,   CA   90034 
## 418                     & Online
## 419                         <NA>
## 420                             
## 421   Los Angeles,   CA   90025 
## 422                     & Online
## 423                         <NA>
## 424                             
## 425   Los Angeles,   CA   90066 
## 426                     & Online
## 427                         <NA>
## 428                             
## 429   Los Angeles,   CA   90025 
## 430                     & Online
## 431                         <NA>
## 432                             
## 433   Los Angeles,   CA   90045 
## 434                     & Online
## 435     Waitlist for new clients
## 436                             
## 437   Los Angeles,   CA   90017 
## 438                     & Online
## 439                         <NA>
## 440                             
## 441   Los Angeles,   CA   90048 
## 442                     & Online
## 443                         <NA>
## 444                             
## 445   Los Angeles,   CA   90011 
## 446                     & Online
## 447                         <NA>
## 448                             
## 449   Los Angeles,   CA   90008 
## 450                     & Online
## 451                         <NA>
## 452                             
## 453   Los Angeles,   CA   90010 
## 454                     & Online
## 455                         <NA>
## 456                             
## 457   Los Angeles,   CA   90025 
## 458                     & Online
## 459     Waitlist for new clients
## 460                             
## 461   Los Angeles,   CA   90025 
## 462                         <NA>
## 463    Not accepting new clients
## 464                             
## 465   Los Angeles,   CA   90045 
## 466                     & Online
## 467                         <NA>
## 468                             
## 469   Los Angeles,   CA   90025 
## 470                     & Online
## 471                         <NA>
## 472                             
## 473   Los Angeles,   CA   90017 
## 474                     & Online
## 475                         <NA>
## 476                             
## 477   Los Angeles,   CA   90049 
## 478                         <NA>
## 479    Not accepting new clients
## 480                             
## 481   Los Angeles,   CA   90066 
## 482                     & Online
## 483                         <NA>
## 484                             
## 485   Los Angeles,   CA   90034 
## 486                     & Online
## 487                         <NA>
## 488                             
## 489   Los Angeles,   CA   90042 
## 490                     & Online
## 491                         <NA>
## 492                             
## 493   Los Angeles,   CA   90045 
## 494                     & Online
## 495                         <NA>
## 496                             
## 497   Los Angeles,   CA   90012 
## 498                     & Online
## 499                         <NA>
## 500                             
## 501   Los Angeles,   CA   90039 
## 502                     & Online
## 503                         <NA>
## 504                             
## 505   Los Angeles,   CA   90066 
## 506                     & Online
## 507                         <NA>
## 508                             
## 509   Los Angeles,   CA   90045 
## 510                     & Online
## 511                         <NA>
## 512                             
## 513   Los Angeles,   CA   90041 
## 514                     & Online
## 515                         <NA>
## 516                             
## 517   Los Angeles,   CA   90025 
## 518                     & Online
## 519                         <NA>
## 520                             
## 521   Los Angeles,   CA   90071 
## 522                         <NA>
## 523    Not accepting new clients
## 524                             
## 525   Los Angeles,   CA   90052 
## 526                         <NA>
## 527    Not accepting new clients
## 528                             
## 529   Los Angeles,   CA   90015 
## 530                     & Online
## 531                         <NA>
## 532                             
## 533   Los Angeles,   CA   90065 
## 534                     & Online
## 535     Waitlist for new clients
## 536                             
## 537   Los Angeles,   CA   90027 
## 538                     & Online
## 539                         <NA>
## 540                             
## 541   Los Angeles,   CA   90038 
## 542                     & Online
## 543                         <NA>
## 544                             
## 545   Los Angeles,   CA   90029 
## 546                     & Online
## 547                         <NA>
## 548                             
## 549   Los Angeles,   CA   90039 
## 550                     & Online
## 551                         <NA>
## 552                             
## 553   Los Angeles,   CA   90025 
## 554                     & Online
## 555                         <NA>
## 556                             
## 557   Los Angeles,   CA   90037 
## 558                     & Online
## 559                         <NA>
## 560                             
## 561   Los Angeles,   CA   90025 
## 562                     & Online
## 563                         <NA>
## 564                             
## 565   Los Angeles,   CA   90037 
## 566                     & Online
## 567                         <NA>
## 568                             
## 569   Los Angeles,   CA   90034 
## 570                     & Online
## 571                         <NA>
## 572                             
## 573   Los Angeles,   CA   90230 
## 574                     & Online
## 575                         <NA>
## 576                             
## 577   Los Angeles,   CA   90012 
## 578                     & Online
## 579                         <NA>
## 580                             
## 581   Los Angeles,   CA   90043 
## 582                     & Online
## 583                         <NA>
## 584                             
## 585   Los Angeles,   CA   90011 
## 586                     & Online
## 587                         <NA>
## 588                             
## 589   Los Angeles,   CA   90049 
## 590                         <NA>
## 591    Not accepting new clients
## 592                             
## 593   Los Angeles,   CA   90017 
## 594                     & Online
## 595                         <NA>
## 596                             
## 597   Los Angeles,   CA   90039 
## 598                     & Online
## 599                         <NA>
## 600                             
## 601   Los Angeles,   CA   90045 
## 602                     & Online
## 603                         <NA>
## 604                             
## 605   Los Angeles,   CA   90041 
## 606                     & Online
## 607                         <NA>
## 608                             
## 609   Los Angeles,   CA   90056 
## 610                     & Online
## 611                         <NA>
## 612                             
## 613   Los Angeles,   CA   90010 
## 614                     & Online
## 615                         <NA>
## 616                             
## 617   Los Angeles,   CA   90052 
## 618                         <NA>
## 619    Not accepting new clients
## 620                             
## 621   Los Angeles,   CA   90045 
## 622                     & Online
## 623     Waitlist for new clients
## 624                             
## 625   Los Angeles,   CA   90062 
## 626                     & Online
## 627                         <NA>
## 628                             
## 629   Los Angeles,   CA   90024 
## 630                     & Online
## 631                         <NA>
## 632                             
## 633   Los Angeles,   CA   90045 
## 634                     & Online
## 635                         <NA>
## 636                             
## 637   Los Angeles,   CA   90010 
## 638                     & Online
## 639                         <NA>
## 640                             
## 641   Los Angeles,   CA   90037 
## 642                     & Online
## 643                         <NA>
## 644                             
## 645   Los Angeles,   CA   90035 
## 646                     & Online
## 647                         <NA>
## 648                             
## 649   Los Angeles,   CA   90038 
## 650                     & Online
## 651                         <NA>
## 652                             
## 653   Los Angeles,   CA   90025 
## 654                     & Online
## 655                         <NA>
## 656                             
## 657   Los Angeles,   CA   90061 
## 658                     & Online
## 659                         <NA>
## 660                             
## 661   Los Angeles,   CA   90041 
## 662                     & Online
## 663                         <NA>
## 664                             
## 665   Los Angeles,   CA   90025 
## 666                     & Online
## 667                         <NA>
## 668                             
## 669   Los Angeles,   CA   90043 
## 670                     & Online
## 671     Waitlist for new clients
## 672                             
## 673   Los Angeles,   CA   90071 
## 674                     & Online
## 675                         <NA>
## 676                             
## 677   Los Angeles,   CA   90019 
## 678                     & Online
## 679                         <NA>
## 680                             
## 681   Los Angeles,   CA   90042 
## 682                     & Online
## 683                         <NA>
## 684                             
## 685   Los Angeles,   CA   90016 
## 686                     & Online
## 687                         <NA>
## 688                             
## 689   Los Angeles,   CA   90034 
## 690                     & Online
## 691                         <NA>
## 692                             
## 693   Los Angeles,   CA   90008 
## 694                     & Online
## 695                         <NA>
## 696                             
## 697   Los Angeles,   CA   90017 
## 698                     & Online
## 699                         <NA>
## 700                             
## 701   Los Angeles,   CA   90036 
## 702                     & Online
## 703                         <NA>
## 704                             
## 705   Los Angeles,   CA   90015 
## 706                     & Online
## 707                         <NA>
## 708                             
## 709   Los Angeles,   CA   90045 
## 710                     & Online
## 711                         <NA>
## 712                             
## 713   Los Angeles,   CA   90025 
## 714                     & Online
## 715                         <NA>
## 716                             
## 717   Los Angeles,   CA   90034 
## 718                     & Online
## 719                         <NA>
## 720                             
## 721   Los Angeles,   CA   90016 
## 722                     & Online
## 723                         <NA>
## 724                             
## 725   Los Angeles,   CA   90047 
## 726                     & Online
## 727                         <NA>
## 728                             
## 729   Los Angeles,   CA   90039 
## 730                     & Online
## 731                         <NA>
## 732                             
## 733   Los Angeles,   CA   90024 
## 734                     & Online
## 735                         <NA>
## 736                             
## 737   Los Angeles,   CA   90071 
## 738                     & Online
## 739                         <NA>
## 740                             
## 741   Los Angeles,   CA   90045 
## 742                         <NA>
## 743    Not accepting new clients
## 744                             
## 745   Los Angeles,   CA   90008 
## 746                     & Online
## 747                         <NA>
## 748                             
## 749   Los Angeles,   CA   90034 
## 750                     & Online
## 751                         <NA>
## 752                             
## 753   Los Angeles,   CA   90095 
## 754                     & Online
## 755                         <NA>
## 756                             
## 757   Los Angeles,   CA   90045 
## 758                     & Online
## 759                         <NA>
## 760                             
## 761   Los Angeles,   CA   90047 
## 762                     & Online
## 763                         <NA>
## 764                             
## 765   Los Angeles,   CA   90065 
## 766                         <NA>
## 767    Not accepting new clients
## 768                             
## 769   Los Angeles,   CA   90008 
## 770                     & Online
## 771                         <NA>
## 772                             
## 773   Los Angeles,   CA   90056 
## 774                     & Online
## 775                         <NA>
## 776                             
## 777   Los Angeles,   CA   90013 
## 778                     & Online
## 779                         <NA>
## 780                             
## 781   Los Angeles,   CA   90077 
## 782                     & Online
## 783                         <NA>
## 784                             
## 785   Los Angeles,   CA   90043 
## 786                     & Online
## 787                         <NA>
## 788                             
## 789   Los Angeles,   CA   90028 
## 790                     & Online
## 791                         <NA>
## 792                             
## 793   Los Angeles,   CA   90036 
## 794                     & Online
## 795                         <NA>
## 796                             
## 797   Los Angeles,   CA   90027 
## 798                     & Online
## 799                         <NA>
## 800                             
## 801   Los Angeles,   CA   90021 
## 802                     & Online
## 803                         <NA>
## 804                             
## 805   Los Angeles,   CA   90036 
## 806                     & Online
## 807                         <NA>
## 808                             
## 809   Los Angeles,   CA   90066 
## 810                     & Online
## 811     Waitlist for new clients
## 812                             
## 813   Los Angeles,   CA   90001 
## 814                     & Online
## 815                         <NA>
## 816                             
## 817   Los Angeles,   CA   90026 
## 818                         <NA>
## 819    Not accepting new clients
## 820                             
## 821   Los Angeles,   CA   90027 
## 822                     & Online
## 823                         <NA>
## 824                             
## 825   Los Angeles,   CA   90044 
## 826                     & Online
## 827                         <NA>
## 828                             
## 829   Los Angeles,   CA   90034 
## 830                     & Online
## 831                         <NA>
## 832                             
## 833   Los Angeles,   CA   90001 
## 834                     & Online
## 835                         <NA>
## 836                             
## 837   Los Angeles,   CA   90034 
## 838                     & Online
## 839     Waitlist for new clients
## 840                             
## 841   Los Angeles,   CA   90008 
## 842                     & Online
## 843                         <NA>
## 844                             
## 845   Los Angeles,   CA   90077 
## 846                     & Online
## 847                         <NA>
## 848                             
## 849   Los Angeles,   CA   90043 
## 850                     & Online
## 851                         <NA>
## 852                             
## 853   Los Angeles,   CA   90040 
## 854                     & Online
## 855                         <NA>
## 856                             
## 857   Los Angeles,   CA   90001 
## 858                     & Online
## 859                         <NA>
## 860                             
## 861   Los Angeles,   CA   90056 
## 862                         <NA>
## 863    Not accepting new clients
## 864                             
## 865   Los Angeles,   CA   90006 
## 866                     & Online
## 867                         <NA>
## 868                             
## 869   Los Angeles,   CA   90045 
## 870                         <NA>
## 871    Not accepting new clients
## 872                             
## 873   Los Angeles,   CA   90034 
## 874                     & Online
## 875                         <NA>
## 876                             
## 877   Los Angeles,   CA   90002 
## 878                     & Online
## 879                         <NA>
## 880                             
## 881   Los Angeles,   CA   90001 
## 882                     & Online
## 883                         <NA>
## 884                             
## 885   Los Angeles,   CA   90008 
## 886                     & Online
## 887                         <NA>
## 888                             
## 889   Los Angeles,   CA   90043 
## 890                     & Online
## 891                         <NA>
## 892                             
## 893   Los Angeles,   CA   90034 
## 894                     & Online
## 895                         <NA>
## 896                             
## 897   Los Angeles,   CA   90001 
## 898                     & Online
## 899                         <NA>
## 900                             
## 901   Los Angeles,   CA   90002 
## 902                     & Online
## 903                         <NA>
## 904                             
## 905   Los Angeles,   CA   90037 
## 906                     & Online
## 907                         <NA>
## 908                             
## 909   Los Angeles,   CA   90005 
## 910                     & Online
## 911                         <NA>
## 912                             
## 913   Los Angeles,   CA   90015 
## 914                     & Online
## 915                         <NA>
## 916                             
## 917   Los Angeles,   CA   90008 
## 918                     & Online
## 919                         <NA>
## 920                             
## 921   Los Angeles,   CA   90001 
## 922                     & Online
## 923                         <NA>
## 924                             
## 925   Los Angeles,   CA   90016 
## 926                     & Online
## 927                         <NA>
## 928                             
## 929   Los Angeles,   CA   90008 
## 930                     & Online
## 931                         <NA>
## 932                             
## 933   Los Angeles,   CA   90056 
## 934                         <NA>
## 935    Not accepting new clients
## 936                             
## 937   Los Angeles,   CA   90034 
## 938                     & Online
## 939                         <NA>
## 940                             
## 941   Los Angeles,   CA   90047 
## 942                     & Online
## 943                         <NA>
## 944                             
## 945   Los Angeles,   CA   90040 
## 946                     & Online
## 947                         <NA>
## 948                             
## 949   Los Angeles,   CA   90001 
## 950                     & Online
## 951                         <NA>
## 952                             
## 953   Los Angeles,   CA   90017 
## 954                     & Online
## 955                         <NA>
## 956                             
## 957   Los Angeles,   CA   90043 
## 958                     & Online
## 959                         <NA>
## 960                             
## 961   Los Angeles,   CA   90010 
## 962                     & Online
## 963                         <NA>
## 964                             
## 965   Los Angeles,   CA   90008 
## 966                     & Online
## 967                         <NA>
## 968                             
## 969   Los Angeles,   CA   90077 
## 970                     & Online
## 971                         <NA>
## 972                             
## 973   Los Angeles,   CA   90045 
## 974                         <NA>
## 975    Not accepting new clients
## 976                             
## 977   Los Angeles,   CA   90035 
## 978                     & Online
## 979     Waitlist for new clients
## 980                             
## 981   Los Angeles,   CA   90002 
## 982                     & Online
## 983                         <NA>
## 984                             
## 985   Los Angeles,   CA   90034 
## 986                     & Online
## 987                         <NA>
## 988                             
## 989   Los Angeles,   CA   90045 
## 990                         <NA>
## 991    Not accepting new clients
## 992                             
## 993   Los Angeles,   CA   90015 
## 994                     & Online
## 995                         <NA>
## 996                             
## 997   Los Angeles,   CA   90034 
## 998                     & Online
## 999                         <NA>
## 1000                            
## 1001  Los Angeles,   CA   90043 
## 1002                    & Online
## 1003                        <NA>
## 1004                            
## 1005  Los Angeles,   CA   90008 
## 1006                    & Online
## 1007                        <NA>
## 1008                            
## 1009  Los Angeles,   CA   90005 
## 1010                    & Online
## 1011                        <NA>
## 1012                            
## 1013  Los Angeles,   CA   90065 
## 1014                    & Online
## 1015                        <NA>
## 1016                            
## 1017  Los Angeles,   CA   90002 
## 1018                    & Online
## 1019                        <NA>
## 1020                            
## 1021  Los Angeles,   CA   90016 
## 1022                    & Online
## 1023                        <NA>
## 1024                            
## 1025  Los Angeles,   CA   90020 
## 1026                    & Online
## 1027                        <NA>
## 1028                            
## 1029  Los Angeles,   CA   90025 
## 1030                    & Online
## 1031                        <NA>
## 1032                            
## 1033  Los Angeles,   CA   90008 
## 1034                    & Online
## 1035                        <NA>
## 1036                            
## 1037  Los Angeles,   CA   90006 
## 1038                    & Online
## 1039                        <NA>
## 1040                            
## 1041  Los Angeles,   CA   90008 
## 1042                    & Online
## 1043                        <NA>
## 1044                            
## 1045  Los Angeles,   CA   90008 
## 1046                    & Online
## 1047                        <NA>
## 1048                            
## 1049  Los Angeles,   CA   90025 
## 1050                        <NA>
## 1051   Not accepting new clients
## 1052                            
## 1053  Los Angeles,   CA   90020 
## 1054                    & Online
## 1055                        <NA>
## 1056                            
## 1057  Los Angeles,   CA   90008 
## 1058                    & Online
## 1059                        <NA>
## 1060                            
## 1061  Los Angeles,   CA   90025 
## 1062                    & Online
## 1063                        <NA>
## 1064                            
## 1065  Los Angeles,   CA   90066 
## 1066                    & Online
## 1067                        <NA>
## 1068                            
## 1069  Los Angeles,   CA   90017 
## 1070                    & Online
## 1071                        <NA>
## 1072                            
## 1073  Los Angeles,   CA   90065 
## 1074                    & Online
## 1075                        <NA>
## 1076                            
## 1077  Los Angeles,   CA   90002 
## 1078                    & Online
## 1079                        <NA>
## 1080                            
## 1081  Los Angeles,   CA   90035 
## 1082                    & Online
## 1083                        <NA>
## 1084                            
## 1085  Los Angeles,   CA   90027 
## 1086                    & Online
## 1087                        <NA>
## 1088                            
## 1089  Los Angeles,   CA   90025 
## 1090                    & Online
## 1091                        <NA>
## 1092                            
## 1093  Los Angeles,   CA   90001 
## 1094                    & Online
## 1095                        <NA>
## 1096                            
## 1097  Los Angeles,   CA   90035 
## 1098                    & Online
## 1099                        <NA>
## 1100                            
## 1101  Los Angeles,   CA   90006 
## 1102                    & Online
## 1103                        <NA>
## 1104                            
## 1105  Los Angeles,   CA   90064 
## 1106                    & Online
## 1107                        <NA>
## 1108                            
## 1109  Los Angeles,   CA   90045 
## 1110                    & Online
## 1111                        <NA>
## 1112                            
## 1113  Los Angeles,   CA   90001 
## 1114                        <NA>
## 1115   Not accepting new clients
## 1116                            
## 1117  Los Angeles,   CA   90045 
## 1118                    & Online
## 1119    Waitlist for new clients
## 1120                            
## 1121  Los Angeles,   CA   90006 
## 1122                    & Online
## 1123                        <NA>
## 1124                            
## 1125  Los Angeles,   CA   90064 
## 1126                    & Online
## 1127                        <NA>
## 1128                            
## 1129  Los Angeles,   CA   90025 
## 1130                        <NA>
## 1131   Not accepting new clients
## 1132                            
## 1133  Los Angeles,   CA   90047 
## 1134                    & Online
## 1135                        <NA>
## 1136                            
## 1137  Los Angeles,   CA   90020 
## 1138                    & Online
## 1139                        <NA>
## 1140                            
## 1141  Los Angeles,   CA   90047 
## 1142                    & Online
## 1143    Waitlist for new clients
## 1144                            
## 1145  Los Angeles,   CA   90002 
## 1146                    & Online
## 1147                        <NA>
## 1148                            
## 1149  Los Angeles,   CA   90066 
## 1150                    & Online
## 1151                        <NA>
## 1152                            
## 1153  Los Angeles,   CA   90029 
## 1154                        <NA>
## 1155   Not accepting new clients
## 1156                            
## 1157  Los Angeles,   CA   90025 
## 1158                    & Online
## 1159                        <NA>
## 1160                            
## 1161  Los Angeles,   CA   90008 
## 1162                    & Online
## 1163                        <NA>
## 1164                            
## 1165  Los Angeles,   CA   90017 
## 1166                    & Online
## 1167                        <NA>
## 1168                            
## 1169  Los Angeles,   CA   90056 
## 1170                    & Online
## 1171                        <NA>
## 1172                            
## 1173  Los Angeles,   CA   90034 
## 1174                    & Online
## 1175                        <NA>
## 1176                            
## 1177  Los Angeles,   CA   90056 
## 1178                    & Online
## 1179                        <NA>
## 1180                            
## 1181  Los Angeles,   CA   90043 
## 1182                    & Online
## 1183                        <NA>
## 1184                            
## 1185  Los Angeles,   CA   90101 
## 1186                    & Online
## 1187                        <NA>
## 1188                            
## 1189  Los Angeles,   CA   90003 
## 1190                    & Online
## 1191                        <NA>
## 1192                            
## 1193  Los Angeles,   CA   90049 
## 1194                        <NA>
## 1195   Not accepting new clients
## 1196                            
## 1197  Los Angeles,   CA   90028 
## 1198                    & Online
## 1199                        <NA>
## 1200                            
## 1201  Los Angeles,   CA   90034 
## 1202                    & Online
## 1203                        <NA>
## 1204                            
## 1205  Los Angeles,   CA   90001 
## 1206                    & Online
## 1207                        <NA>
## 1208                            
## 1209  Los Angeles,   CA   90010 
## 1210                    & Online
## 1211    Waitlist for new clients
## 1212                            
## 1213  Los Angeles,   CA   90077 
## 1214                    & Online
## 1215                        <NA>
## 1216                            
## 1217  Los Angeles,   CA   90048 
## 1218                        <NA>
## 1219   Not accepting new clients
## 1220                            
## 1221  Los Angeles,   CA   90027 
## 1222                    & Online
## 1223                        <NA>
## 1224                            
## 1225  Los Angeles,   CA   90015 
## 1226                    & Online
## 1227                        <NA>
## 1228                            
## 1229  Los Angeles,   CA   90004 
## 1230                    & Online
## 1231                        <NA>
## 1232                            
## 1233  Los Angeles,   CA   90048 
## 1234                        <NA>
## 1235   Not accepting new clients
## 1236                            
## 1237  Los Angeles,   CA   90011 
## 1238                    & Online
## 1239                        <NA>
## 1240                            
## 1241  Los Angeles,   CA   90019 
## 1242                    & Online
## 1243                        <NA>
## 1244                            
## 1245  Los Angeles,   CA   90066 
## 1246                    & Online
## 1247                        <NA>
## 1248                            
## 1249  Los Angeles,   CA   90019 
## 1250                    & Online
## 1251                        <NA>
## 1252                            
## 1253  Los Angeles,   CA   90071 
## 1254                    & Online
## 1255                        <NA>
## 1256                            
## 1257  Los Angeles,   CA   90008 
## 1258                    & Online
## 1259                        <NA>
## 1260                            
## 1261  Los Angeles,   CA   90045 
## 1262                    & Online
## 1263                        <NA>
## 1264                            
## 1265  Los Angeles,   CA   90064 
## 1266                    & Online
## 1267                        <NA>
## 1268                            
## 1269  Los Angeles,   CA   90064 
## 1270                    & Online
## 1271    Waitlist for new clients
## 1272                            
## 1273  Los Angeles,   CA   90066 
## 1274                    & Online
## 1275                        <NA>
## 1276                            
## 1277  Los Angeles,   CA   90025 
## 1278                    & Online
## 1279                        <NA>
## 1280                            
## 1281  Los Angeles,   CA   90025 
## 1282                    & Online
## 1283                        <NA>
## 1284                            
## 1285  Los Angeles,   CA   90066 
## 1286                    & Online
## 1287                        <NA>
## 1288                            
## 1289  Los Angeles,   CA   90034 
## 1290                    & Online
## 1291                        <NA>
## 1292                            
## 1293  Los Angeles,   CA   90071 
## 1294                    & Online
## 1295                        <NA>
## 1296                            
## 1297  Los Angeles,   CA   90039 
## 1298                    & Online
## 1299                        <NA>
## 1300                            
## 1301  Los Angeles,   CA   90025 
## 1302                    & Online
## 1303                        <NA>
## 1304                            
## 1305  Los Angeles,   CA   90025 
## 1306                    & Online
## 1307                        <NA>
## 1308                            
## 1309  Los Angeles,   CA   90025 
## 1310                    & Online
## 1311                        <NA>
## 1312                            
## 1313  Los Angeles,   CA   90064 
## 1314                        <NA>
## 1315   Not accepting new clients
## 1316                            
## 1317  Los Angeles,   CA   90048 
## 1318                    & Online
## 1319                        <NA>
## 1320                            
## 1321  Los Angeles,   CA   90029 
## 1322                    & Online
## 1323                        <NA>
## 1324                            
## 1325  Los Angeles,   CA   90005 
## 1326                    & Online
## 1327                        <NA>
## 1328                            
## 1329  Los Angeles,   CA   90066 
## 1330                    & Online
## 1331                        <NA>
## 1332                            
## 1333  Los Angeles,   CA   90066 
## 1334                    & Online
## 1335                        <NA>
## 1336                            
## 1337  Los Angeles,   CA   90008 
## 1338                    & Online
## 1339                        <NA>
## 1340                            
## 1341  Los Angeles,   CA   90047 
## 1342                        <NA>
## 1343   Not accepting new clients
## 1344                            
## 1345  Los Angeles,   CA   90025 
## 1346                    & Online
## 1347                        <NA>
## 1348                            
## 1349  Los Angeles,   CA   90024 
## 1350                    & Online
## 1351                        <NA>
## 1352                            
## 1353  Los Angeles,   CA   90034 
## 1354                    & Online
## 1355                        <NA>
## 1356                            
## 1357  Los Angeles,   CA   90046 
## 1358                    & Online
## 1359                        <NA>
## 1360                            
## 1361  Los Angeles,   CA   90010 
## 1362                    & Online
## 1363                        <NA>
## 1364                            
## 1365  Los Angeles,   CA   90039 
## 1366                    & Online
## 1367                        <NA>
## 1368                            
## 1369  Los Angeles,   CA   90064 
## 1370                    & Online
## 1371                        <NA>
## 1372                            
## 1373  Los Angeles,   CA   90018 
## 1374                    & Online
## 1375                        <NA>
## 1376                            
## 1377  Los Angeles,   CA   90010 
## 1378                    & Online
## 1379                        <NA>
## 1380                            
## 1381  Los Angeles,   CA   90048 
## 1382                    & Online
## 1383                        <NA>
## 1384                            
## 1385  Los Angeles,   CA   90046 
## 1386                    & Online
## 1387                        <NA>
## 1388                            
## 1389  Los Angeles,   CA   90016 
## 1390                    & Online
## 1391                        <NA>
## 1392                            
## 1393  Los Angeles,   CA   90007 
## 1394                    & Online
## 1395                        <NA>
## 1396                            
## 1397  Los Angeles,   CA   90011 
## 1398                    & Online
## 1399                        <NA>
## 1400                            
## 1401  Los Angeles,   CA   90041 
## 1402                        <NA>
## 1403   Not accepting new clients
## 1404                            
## 1405  Los Angeles,   CA   90005 
## 1406                    & Online
## 1407                        <NA>
## 1408                            
## 1409  Los Angeles,   CA   90025 
## 1410                    & Online
## 1411                        <NA>
## 1412                            
## 1413  Los Angeles,   CA   90025 
## 1414                    & Online
## 1415                        <NA>
## 1416                            
## 1417  Los Angeles,   CA   90066 
## 1418                        <NA>
## 1419   Not accepting new clients
## 1420                            
## 1421  Los Angeles,   CA   90017 
## 1422                    & Online
## 1423                        <NA>
## 1424                            
## 1425  Los Angeles,   CA   90026 
## 1426                    & Online
## 1427                        <NA>
## 1428                            
## 1429  Los Angeles,   CA   90025 
## 1430                    & Online
## 1431                        <NA>
## 1432                            
## 1433  Los Angeles,   CA   90025 
## 1434                    & Online
## 1435                        <NA>
## 1436                            
## 1437  Los Angeles,   CA   90066 
## 1438                    & Online
## 1439                        <NA>
## 1440                            
## 1441  Los Angeles,   CA   90071 
## 1442                    & Online
## 1443                        <NA>
## 1444                            
## 1445  Los Angeles,   CA   90010 
## 1446                    & Online
## 1447                        <NA>
## 1448                            
## 1449  Los Angeles,   CA   90025 
## 1450                    & Online
## 1451                        <NA>
## 1452                            
## 1453  Los Angeles,   CA   90026 
## 1454                    & Online
## 1455                        <NA>
## 1456                            
## 1457  Los Angeles,   CA   90039 
## 1458                    & Online
## 1459                        <NA>
## 1460                            
## 1461  Los Angeles,   CA   90016 
## 1462                    & Online
## 1463    Waitlist for new clients
## 1464                            
## 1465  Los Angeles,   CA   90024 
## 1466                    & Online
## 1467                        <NA>
## 1468                            
## 1469  Los Angeles,   CA   90027 
## 1470                    & Online
## 1471                        <NA>
## 1472                            
## 1473  Los Angeles,   CA   90025 
## 1474                    & Online
## 1475                        <NA>
## 1476                            
## 1477  Los Angeles,   CA   90015 
## 1478                    & Online
## 1479                        <NA>
## 1480                            
## 1481  Los Angeles,   CA   90048 
## 1482                    & Online
## 1483                        <NA>
## 1484                            
## 1485  Los Angeles,   CA   90064 
## 1486                    & Online
## 1487                        <NA>
## 1488                            
## 1489  Los Angeles,   CA   90056 
## 1490                    & Online
## 1491                        <NA>
## 1492                            
## 1493  Los Angeles,   CA   90067 
## 1494                    & Online
## 1495                        <NA>
## 1496                            
## 1497  Los Angeles,   CA   90027 
## 1498                    & Online
## 1499                        <NA>
## 1500                            
## 1501  Los Angeles,   CA   90046 
## 1502                    & Online
## 1503                        <NA>
## 1504                            
## 1505  Los Angeles,   CA   90025 
## 1506                    & Online
## 1507                        <NA>
## 1508                            
## 1509  Los Angeles,   CA   90071 
## 1510                        <NA>
## 1511   Not accepting new clients
## 1512                            
## 1513  Los Angeles,   CA   90008 
## 1514                    & Online
## 1515                        <NA>
## 1516                            
## 1517  Los Angeles,   CA   90046 
## 1518                    & Online
## 1519                        <NA>
## 1520                            
## 1521  Los Angeles,   CA   90067 
## 1522                    & Online
## 1523                        <NA>
## 1524                            
## 1525  Los Angeles,   CA   90046 
## 1526                    & Online
## 1527                        <NA>
## 1528                            
## 1529  Los Angeles,   CA   90056 
## 1530                    & Online
## 1531                        <NA>
## 1532                            
## 1533  Los Angeles,   CA   90027 
## 1534                    & Online
## 1535                        <NA>
## 1536                            
## 1537  Los Angeles,   CA   90046 
## 1538                        <NA>
## 1539   Not accepting new clients
## 1540                            
## 1541  Los Angeles,   CA   90039 
## 1542                    & Online
## 1543                        <NA>
## 1544                            
## 1545  Los Angeles,   CA   90065 
## 1546                    & Online
## 1547                        <NA>
## 1548                            
## 1549  Los Angeles,   CA   90066 
## 1550                    & Online
## 1551                        <NA>
## 1552                            
## 1553  Los Angeles,   CA   90008 
## 1554                    & Online
## 1555                        <NA>
## 1556                            
## 1557  Los Angeles,   CA   90026 
## 1558                    & Online
## 1559                        <NA>
## 1560                            
## 1561  Los Angeles,   CA   90067 
## 1562                    & Online
## 1563                        <NA>
## 1564                            
## 1565  Los Angeles,   CA   90019 
## 1566                    & Online
## 1567    Waitlist for new clients
## 1568                            
## 1569  Los Angeles,   CA   90001 
## 1570                    & Online
## 1571                        <NA>
## 1572                            
## 1573  Los Angeles,   CA   90059 
## 1574                    & Online
## 1575                        <NA>
## 1576                            
## 1577  Los Angeles,   CA   90230 
## 1578                    & Online
## 1579                        <NA>
## 1580                            
## 1581  Los Angeles,   CA   90012 
## 1582                    & Online
## 1583                        <NA>
## 1584                            
## 1585  Los Angeles,   CA   90049 
## 1586                    & Online
## 1587                        <NA>
## 1588                            
## 1589  Los Angeles,   CA   90003 
## 1590                    & Online
## 1591    Waitlist for new clients
## 1592                            
## 1593  Los Angeles,   CA   90002 
## 1594                    & Online
## 1595                        <NA>
## 1596                            
## 1597  Los Angeles,   CA   90041 
## 1598                    & Online
## 1599                        <NA>
## 1600                            
## 1601  Los Angeles,   CA   90049 
## 1602                    & Online
## 1603                        <NA>
## 1604                            
## 1605  Los Angeles,   CA   90047 
## 1606                    & Online
## 1607                        <NA>
## 1608                            
## 1609  Los Angeles,   CA   90019 
## 1610                    & Online
## 1611    Waitlist for new clients
## 1612                            
## 1613  Los Angeles,   CA   90059 
## 1614                    & Online
## 1615                        <NA>
## 1616                            
## 1617  Los Angeles,   CA   90045 
## 1618                    & Online
## 1619                        <NA>
## 1620                            
## 1621  Los Angeles,   CA   90051 
## 1622                    & Online
## 1623                        <NA>
## 1624                            
## 1625  Los Angeles,   CA   90001 
## 1626                    & Online
## 1627                        <NA>
## 1628                            
## 1629  Los Angeles,   CA   90001 
## 1630                    & Online
## 1631                        <NA>
## 1632                            
## 1633  Los Angeles,   CA   90041 
## 1634                    & Online
## 1635                        <NA>
## 1636                            
## 1637  Los Angeles,   CA   90003 
## 1638                    & Online
## 1639                        <NA>
## 1640                            
## 1641  Los Angeles,   CA   90012 
## 1642                    & Online
## 1643                        <NA>
## 1644                            
## 1645  Los Angeles,   CA   90042 
## 1646                    & Online
## 1647                        <NA>
## 1648                            
## 1649  Los Angeles,   CA   90049 
## 1650                    & Online
## 1651                        <NA>
## 1652                            
## 1653  Los Angeles,   CA   90034 
## 1654                    & Online
## 1655    Waitlist for new clients
## 1656                            
## 1657  Los Angeles,   CA   90001 
## 1658                    & Online
## 1659                        <NA>
## 1660                            
## 1661  Los Angeles,   CA   90011 
## 1662                    & Online
## 1663                        <NA>
## 1664                            
## 1665  Los Angeles,   CA   90004 
## 1666                    & Online
## 1667                        <NA>
## 1668                            
## 1669  Los Angeles,   CA   90025 
## 1670                    & Online
## 1671    Waitlist for new clients
## 1672                            
## 1673  Los Angeles,   CA   90063 
## 1674                    & Online
## 1675                        <NA>
## 1676                            
## 1677  Los Angeles,   CA   90064 
## 1678                    & Online
## 1679                        <NA>
## 1680                            
## 1681  Los Angeles,   CA   90008 
## 1682                    & Online
## 1683                        <NA>
## 1684                            
## 1685  Los Angeles,   CA   90034 
## 1686                    & Online
## 1687    Waitlist for new clients
## 1688                            
## 1689  Los Angeles,   CA   90025 
## 1690                    & Online
## 1691                        <NA>
## 1692                            
## 1693  Los Angeles,   CA   90027 
## 1694                    & Online
## 1695                        <NA>
## 1696                            
## 1697  Los Angeles,   CA   90012 
## 1698                    & Online
## 1699                        <NA>
## 1700                            
## 1701  Los Angeles,   CA   90023 
## 1702                    & Online
## 1703                        <NA>
## 1704                            
## 1705  Los Angeles,   CA   90006 
## 1706                    & Online
## 1707                        <NA>
## 1708                            
## 1709  Los Angeles,   CA   90063 
## 1710                    & Online
## 1711                        <NA>
## 1712                            
## 1713  Los Angeles,   CA   90001 
## 1714                    & Online
## 1715                        <NA>
## 1716                            
## 1717  Los Angeles,   CA   90011 
## 1718                    & Online
## 1719                        <NA>
## 1720                            
## 1721  Los Angeles,   CA   90046 
## 1722                    & Online
## 1723                        <NA>
## 1724                            
## 1725  Los Angeles,   CA   90007 
## 1726                    & Online
## 1727                        <NA>
## 1728                            
## 1729  Los Angeles,   CA   90012 
## 1730                    & Online
## 1731                        <NA>
## 1732                            
## 1733  Los Angeles,   CA   90065 
## 1734                    & Online
## 1735                        <NA>
## 1736                            
## 1737  Los Angeles,   CA   90004 
## 1738                    & Online
## 1739                        <NA>
## 1740                            
## 1741  Los Angeles,   CA   90043 
## 1742                    & Online
## 1743                        <NA>
## 1744                            
## 1745  Los Angeles,   CA   90001 
## 1746                    & Online
## 1747                        <NA>
## 1748                            
## 1749  Los Angeles,   CA   90001 
## 1750                    & Online
## 1751                        <NA>
## 1752                            
## 1753  Los Angeles,   CA   90005 
## 1754                    & Online
## 1755                        <NA>
## 1756                            
## 1757  Los Angeles,   CA   90001 
## 1758                    & Online
## 1759                        <NA>
## 1760                            
## 1761  Los Angeles,   CA   90034 
## 1762                    & Online
## 1763                        <NA>
## 1764                            
## 1765  Los Angeles,   CA   90015 
## 1766                    & Online
## 1767    Waitlist for new clients
## 1768                            
## 1769  Los Angeles,   CA   90077 
## 1770                    & Online
## 1771                        <NA>
## 1772                            
## 1773  Los Angeles,   CA   90036 
## 1774                    & Online
## 1775                        <NA>
## 1776                            
## 1777  Los Angeles,   CA   90001 
## 1778                    & Online
## 1779                        <NA>
## 1780                            
## 1781  Los Angeles,   CA   90011 
## 1782                    & Online
## 1783                        <NA>
## 1784                            
## 1785  Los Angeles,   CA   90005 
## 1786                        <NA>
## 1787   Not accepting new clients
## 1788                            
## 1789  Los Angeles,   CA   90025 
## 1790                        <NA>
## 1791   Not accepting new clients
## 1792                            
## 1793  Los Angeles,   CA   90025 
## 1794                    & Online
## 1795                        <NA>
## 1796                            
## 1797  Los Angeles,   CA   90059 
## 1798                    & Online
## 1799                        <NA>
## 1800                            
## 1801  Los Angeles,   CA   90064 
## 1802                    & Online
## 1803                        <NA>
## 1804                            
## 1805  Los Angeles,   CA   90016 
## 1806                    & Online
## 1807                        <NA>
## 1808                            
## 1809  Los Angeles,   CA   90028 
## 1810                    & Online
## 1811                        <NA>
## 1812                            
## 1813  Los Angeles,   CA   90024 
## 1814                    & Online
## 1815                        <NA>
## 1816                            
## 1817  Los Angeles,   CA   90049 
## 1818                    & Online
## 1819                        <NA>
## 1820                            
## 1821  Los Angeles,   CA   90045 
## 1822                    & Online
## 1823                        <NA>
## 1824                            
## 1825  Los Angeles,   CA   90038 
## 1826                    & Online
## 1827                        <NA>
## 1828                            
## 1829  Los Angeles,   CA   90064 
## 1830                    & Online
## 1831                        <NA>
## 1832                            
## 1833  Los Angeles,   CA   90039 
## 1834                        <NA>
## 1835   Not accepting new clients
## 1836                            
## 1837  Los Angeles,   CA   90025 
## 1838                    & Online
## 1839                        <NA>
## 1840                            
## 1841  Los Angeles,   CA   90064 
## 1842                    & Online
## 1843                        <NA>
## 1844                            
## 1845  Los Angeles,   CA   90071 
## 1846                    & Online
## 1847                        <NA>
## 1848                            
## 1849  Los Angeles,   CA   90004 
## 1850                    & Online
## 1851                        <NA>
## 1852                            
## 1853  Los Angeles,   CA   90043 
## 1854                        <NA>
## 1855   Not accepting new clients
## 1856                            
## 1857  Los Angeles,   CA   90034 
## 1858                    & Online
## 1859                        <NA>
## 1860                            
## 1861  Los Angeles,   CA   90048 
## 1862                    & Online
## 1863                        <NA>
## 1864                            
## 1865  Los Angeles,   CA   90066 
## 1866                        <NA>
## 1867   Not accepting new clients
## 1868                            
## 1869  Los Angeles,   CA   90025 
## 1870                    & Online
## 1871                        <NA>
## 1872                            
## 1873  Los Angeles,   CA   90025 
## 1874                    & Online
## 1875                        <NA>
## 1876                            
## 1877  Los Angeles,   CA   90008 
## 1878                        <NA>
## 1879                        <NA>
## 1880                            
## 1881  Los Angeles,   CA   90010 
## 1882                    & Online
## 1883                        <NA>
## 1884                            
## 1885  Los Angeles,   CA   90064 
## 1886                    & Online
## 1887                        <NA>
## 1888                            
## 1889  Los Angeles,   CA   90045 
## 1890                    & Online
## 1891                        <NA>
## 1892                            
## 1893  Los Angeles,   CA   90025 
## 1894                    & Online
## 1895                        <NA>
## 1896                            
## 1897  Los Angeles,   CA   90015 
## 1898                        <NA>
## 1899                        <NA>
## 1900                            
## 1901  Los Angeles,   CA   90025 
## 1902                    & Online
## 1903                        <NA>
## 1904                            
## 1905  Los Angeles,   CA   90025 
## 1906                    & Online
## 1907                        <NA>
## 1908                            
## 1909  Los Angeles,   CA   90036 
## 1910                        <NA>
## 1911                        <NA>
## 1912                            
## 1913  Los Angeles,   CA   90064 
## 1914                    & Online
## 1915                        <NA>
## 1916                            
## 1917  Los Angeles,   CA   90049 
## 1918                    & Online
## 1919                        <NA>
## 1920                            
## 1921  Los Angeles,   CA   90039 
## 1922                    & Online
## 1923                        <NA>
## 1924                            
## 1925  Los Angeles,   CA   90010 
## 1926                    & Online
## 1927                        <NA>
## 1928                            
## 1929  Los Angeles,   CA   90025 
## 1930                    & Online
## 1931                        <NA>
## 1932                            
## 1933  Los Angeles,   CA   90064 
## 1934                    & Online
## 1935                        <NA>
## 1936                            
## 1937  Los Angeles,   CA   90027 
## 1938                    & Online
## 1939                        <NA>
## 1940                            
## 1941  Los Angeles,   CA   90036 
## 1942                    & Online
## 1943                        <NA>
## 1944                            
## 1945  Los Angeles,   CA   90028 
## 1946                    & Online
## 1947                        <NA>
## 1948                            
## 1949  Los Angeles,   CA   90015 
## 1950                    & Online
## 1951                        <NA>
## 1952                            
## 1953  Los Angeles,   CA   90008 
## 1954                    & Online
## 1955                        <NA>
## 1956                            
## 1957  Los Angeles,   CA   90024 
## 1958                    & Online
## 1959                        <NA>
## 1960                            
## 1961  Los Angeles,   CA   90045 
## 1962                        <NA>
## 1963                        <NA>
## 1964                            
## 1965  Los Angeles,   CA   90071 
## 1966                    & Online
## 1967                        <NA>
## 1968                            
## 1969  Los Angeles,   CA   90008 
## 1970                        <NA>
## 1971                        <NA>
## 1972                            
## 1973  Los Angeles,   CA   90047 
## 1974                    & Online
## 1975                        <NA>
## 1976                            
## 1977  Los Angeles,   CA   90049 
## 1978                    & Online
## 1979                        <NA>
## 1980                            
## 1981  Los Angeles,   CA   90036 
## 1982                    & Online
## 1983                        <NA>
## 1984                            
## 1985  Los Angeles,   CA   90041 
## 1986                    & Online
## 1987                        <NA>
## 1988                            
## 1989  Los Angeles,   CA   90034 
## 1990                    & Online
## 1991                        <NA>
## 1992                            
## 1993  Los Angeles,   CA   90026 
## 1994                    & Online
## 1995                        <NA>
## 1996                            
## 1997  Los Angeles,   CA   90041 
## 1998                    & Online
## 1999    Waitlist for new clients
## 2000                            
## 2001  Los Angeles,   CA   90024 
## 2002                    & Online
## 2003                        <NA>
## 2004                            
## 2005  Los Angeles,   CA   90025 
## 2006                    & Online
## 2007                        <NA>
## 2008                            
## 2009  Los Angeles,   CA   90048 
## 2010                    & Online
## 2011                        <NA>
## 2012                            
## 2013  Los Angeles,   CA   90048 
## 2014                    & Online
## 2015                        <NA>
## 2016                            
## 2017  Los Angeles,   CA   90024 
## 2018                    & Online
## 2019                        <NA>
## 2020                            
## 2021  Los Angeles,   CA   90059 
## 2022                    & Online
## 2023                        <NA>
## 2024                            
## 2025  Los Angeles,   CA   90046 
## 2026                    & Online
## 2027                        <NA>
## 2028                            
## 2029  Los Angeles,   CA   90039 
## 2030                        <NA>
## 2031   Not accepting new clients
## 2032                            
## 2033  Los Angeles,   CA   90008 
## 2034                        <NA>
## 2035                        <NA>
## 2036                            
## 2037  Los Angeles,   CA   90038 
## 2038                    & Online
## 2039                        <NA>
## 2040                            
## 2041  Los Angeles,   CA   90028 
## 2042                    & Online
## 2043                        <NA>
## 2044                            
## 2045  Los Angeles,   CA   90016 
## 2046                    & Online
## 2047                        <NA>
## 2048                            
## 2049  Los Angeles,   CA   90048 
## 2050                        <NA>
## 2051                        <NA>
## 2052                            
## 2053  Los Angeles,   CA   90017 
## 2054                    & Online
## 2055    Waitlist for new clients
## 2056                            
## 2057  Los Angeles,   CA   90064 
## 2058                    & Online
## 2059                        <NA>
## 2060                            
## 2061  Los Angeles,   CA   90036 
## 2062                    & Online
## 2063                        <NA>
## 2064                            
## 2065  Los Angeles,   CA   90043 
## 2066                        <NA>
## 2067   Not accepting new clients
## 2068                            
## 2069  Los Angeles,   CA   90064 
## 2070                    & Online
## 2071                        <NA>
## 2072                            
## 2073  Los Angeles,   CA   90042 
## 2074                    & Online
## 2075                        <NA>
## 2076                            
## 2077  Los Angeles,   CA   90044 
## 2078                    & Online
## 2079                        <NA>
## 2080                            
## 2081  Los Angeles,   CA   90066 
## 2082                        <NA>
## 2083                        <NA>
## 2084                            
## 2085  Los Angeles,   CA   90064 
## 2086                    & Online
## 2087                        <NA>
## 2088                            
## 2089  Los Angeles,   CA   90025 
## 2090                        <NA>
## 2091   Not accepting new clients
## 2092                            
## 2093  Los Angeles,   CA   90048 
## 2094                    & Online
## 2095                        <NA>
## 2096                            
## 2097  Los Angeles,   CA   90025 
## 2098                    & Online
## 2099                        <NA>
## 2100                            
## 2101  Los Angeles,   CA   90042 
## 2102                    & Online
## 2103                        <NA>
## 2104                            
## 2105  Los Angeles,   CA   90025 
## 2106                    & Online
## 2107                        <NA>
## 2108                            
## 2109  Los Angeles,   CA   90048 
## 2110                    & Online
## 2111                        <NA>
## 2112                            
## 2113  Los Angeles,   CA   90048 
## 2114                    & Online
## 2115                        <NA>
## 2116                            
## 2117  Los Angeles,   CA   90025 
## 2118                        <NA>
## 2119                        <NA>
## 2120                            
## 2121  Los Angeles,   CA   90066 
## 2122                    & Online
## 2123                        <NA>
## 2124                            
## 2125  Los Angeles,   CA   90064 
## 2126                        <NA>
## 2127                        <NA>
## 2128                            
## 2129  Los Angeles,   CA   90004 
## 2130                    & Online
## 2131                        <NA>
## 2132                            
## 2133  Los Angeles,   CA   90071 
## 2134                    & Online
## 2135                        <NA>
## 2136                            
## 2137  Los Angeles,   CA   90025 
## 2138                    & Online
## 2139    Waitlist for new clients
## 2140                            
## 2141  Los Angeles,   CA   90025 
## 2142                    & Online
## 2143                        <NA>
## 2144                            
## 2145  Los Angeles,   CA   90025 
## 2146                    & Online
## 2147                        <NA>
## 2148                            
## 2149  Los Angeles,   CA   90064 
## 2150                    & Online
## 2151                        <NA>
## 2152                            
## 2153  Los Angeles,   CA   90048 
## 2154                    & Online
## 2155                        <NA>
## 2156                            
## 2157  Los Angeles,   CA   90024 
## 2158                    & Online
## 2159                        <NA>
## 2160                            
## 2161  Los Angeles,   CA   90066 
## 2162                    & Online
## 2163                        <NA>
## 2164                            
## 2165  Los Angeles,   CA   90007 
## 2166                    & Online
## 2167                        <NA>
## 2168                            
## 2169  Los Angeles,   CA   90028 
## 2170                    & Online
## 2171                        <NA>
## 2172                            
## 2173  Los Angeles,   CA   90025 
## 2174                    & Online
## 2175                        <NA>
## 2176                            
## 2177  Los Angeles,   CA   90068 
## 2178                    & Online
## 2179                        <NA>
## 2180                            
## 2181  Los Angeles,   CA   90017 
## 2182                    & Online
## 2183    Waitlist for new clients
## 2184                            
## 2185  Los Angeles,   CA   90064 
## 2186                    & Online
## 2187                        <NA>
## 2188                            
## 2189  Los Angeles,   CA   90026 
## 2190                    & Online
## 2191                        <NA>
## 2192                            
## 2193  Los Angeles,   CA   90024 
## 2194                        <NA>
## 2195   Not accepting new clients
## 2196                            
## 2197  Los Angeles,   CA   90025 
## 2198                    & Online
## 2199                        <NA>
## 2200                            
## 2201  Los Angeles,   CA   90064 
## 2202                    & Online
## 2203                        <NA>
## 2204                            
## 2205  Los Angeles,   CA   90048 
## 2206                    & Online
## 2207                        <NA>
## 2208                            
## 2209  Los Angeles,   CA   90039 
## 2210                    & Online
## 2211    Waitlist for new clients
## 2212                            
## 2213  Los Angeles,   CA   90025 
## 2214                    & Online
## 2215                        <NA>
## 2216                            
## 2217  Los Angeles,   CA   90039 
## 2218                        <NA>
## 2219   Not accepting new clients
## 2220                            
## 2221  Los Angeles,   CA   90004 
## 2222                    & Online
## 2223                        <NA>
## 2224                            
## 2225  Los Angeles,   CA   90036 
## 2226                    & Online
## 2227                        <NA>
## 2228                            
## 2229  Los Angeles,   CA   90013 
## 2230                    & Online
## 2231                        <NA>
## 2232                            
## 2233  Los Angeles,   CA   90066 
## 2234                    & Online
## 2235                        <NA>
## 2236                            
## 2237  Los Angeles,   CA   90007 
## 2238                        <NA>
## 2239   Not accepting new clients
## 2240                            
## 2241  Los Angeles,   CA   90036 
## 2242                    & Online
## 2243                        <NA>
## 2244                            
## 2245  Los Angeles,   CA   90064 
## 2246                    & Online
## 2247                        <NA>
## 2248                            
## 2249  Los Angeles,   CA   90025 
## 2250                    & Online
## 2251                        <NA>
## 2252                            
## 2253  Los Angeles,   CA   90034 
## 2254                    & Online
## 2255                        <NA>
## 2256                            
## 2257  Los Angeles,   CA   90064 
## 2258                    & Online
## 2259                        <NA>
## 2260                            
## 2261  Los Angeles,   CA   90048 
## 2262                    & Online
## 2263                        <NA>
## 2264                            
## 2265  Los Angeles,   CA   90044 
## 2266                    & Online
## 2267                        <NA>
## 2268                            
## 2269  Los Angeles,   CA   90036 
## 2270                    & Online
## 2271                        <NA>
## 2272                            
## 2273  Los Angeles,   CA   90013 
## 2274                    & Online
## 2275                        <NA>
## 2276                            
## 2277  Los Angeles,   CA   90025 
## 2278                    & Online
## 2279                        <NA>
## 2280                            
## 2281  Los Angeles,   CA   90024 
## 2282                    & Online
## 2283                        <NA>
## 2284                            
## 2285  Los Angeles,   CA   90045 
## 2286                        <NA>
## 2287                        <NA>
## 2288                            
## 2289  Los Angeles,   CA   90025 
## 2290                    & Online
## 2291                        <NA>
## 2292                            
## 2293  Los Angeles,   CA   90024 
## 2294                    & Online
## 2295                        <NA>
## 2296                            
## 2297  Los Angeles,   CA   90064 
## 2298                    & Online
## 2299                        <NA>
## 2300                            
## 2301  Los Angeles,   CA   90039 
## 2302                        <NA>
## 2303   Not accepting new clients
## 2304                            
## 2305  Los Angeles,   CA   90045 
## 2306                    & Online
## 2307                        <NA>
## 2308                            
## 2309  Los Angeles,   CA   90034 
## 2310                        <NA>
## 2311   Not accepting new clients
## 2312                            
## 2313  Los Angeles,   CA   90069 
## 2314                    & Online
## 2315                        <NA>
## 2316                            
## 2317  Los Angeles,   CA   90064 
## 2318                    & Online
## 2319                        <NA>
## 2320                            
## 2321  Los Angeles,   CA   90064 
## 2322                    & Online
## 2323                        <NA>
## 2324                            
## 2325  Los Angeles,   CA   90036 
## 2326                    & Online
## 2327                        <NA>
## 2328                            
## 2329  Los Angeles,   CA   90025 
## 2330                    & Online
## 2331    Waitlist for new clients
## 2332                            
## 2333  Los Angeles,   CA   90025 
## 2334                        <NA>
## 2335                        <NA>
## 2336                            
## 2337  Los Angeles,   CA   90068 
## 2338                        <NA>
## 2339   Not accepting new clients
## 2340                            
## 2341  Los Angeles,   CA   90056 
## 2342                    & Online
## 2343                        <NA>
## 2344                            
## 2345  Los Angeles,   CA   90025 
## 2346                    & Online
## 2347                        <NA>
## 2348                            
## 2349  Los Angeles,   CA   90034 
## 2350                    & Online
## 2351                        <NA>
## 2352                            
## 2353  Los Angeles,   CA   90008 
## 2354                        <NA>
## 2355                        <NA>
## 2356                            
## 2357  Los Angeles,   CA   90036 
## 2358                    & Online
## 2359                        <NA>
## 2360                            
## 2361  Los Angeles,   CA   90034 
## 2362                    & Online
## 2363                        <NA>
## 2364                            
## 2365  Los Angeles,   CA   90042 
## 2366                    & Online
## 2367                        <NA>
## 2368                            
## 2369  Los Angeles,   CA   90047 
## 2370                    & Online
## 2371                        <NA>
## 2372                            
## 2373  Los Angeles,   CA   90059 
## 2374                    & Online
## 2375                        <NA>
## 2376                            
## 2377  Los Angeles,   CA   90015 
## 2378                        <NA>
## 2379                        <NA>
## 2380                            
## 2381  Los Angeles,   CA   90025 
## 2382                    & Online
## 2383                        <NA>
## 2384                            
## 2385  Los Angeles,   CA   90028 
## 2386                    & Online
## 2387                        <NA>
## 2388                            
## 2389  Los Angeles,   CA   90036 
## 2390                    & Online
## 2391                        <NA>
## 2392                            
## 2393  Los Angeles,   CA   90010 
## 2394                    & Online
## 2395                        <NA>
## 2396                            
## 2397  Los Angeles,   CA   90028 
## 2398                    & Online
## 2399                        <NA>
## 2400                            
## 2401  Los Angeles,   CA   90025 
## 2402                        <NA>
## 2403                        <NA>
## 2404                            
## 2405  Los Angeles,   CA   90004 
## 2406                    & Online
## 2407                        <NA>
## 2408                            
## 2409  Los Angeles,   CA   90048 
## 2410                    & Online
## 2411                        <NA>
## 2412                            
## 2413  Los Angeles,   CA   90066 
## 2414                    & Online
## 2415                        <NA>
## 2416                            
## 2417  Los Angeles,   CA   90025 
## 2418                    & Online
## 2419                        <NA>
## 2420                            
## 2421  Los Angeles,   CA   90007 
## 2422                        <NA>
## 2423   Not accepting new clients
## 2424                            
## 2425  Los Angeles,   CA   90064 
## 2426                    & Online
## 2427                        <NA>
## 2428                            
## 2429  Los Angeles,   CA   90035 
## 2430                    & Online
## 2431                        <NA>
## 2432                            
## 2433  Los Angeles,   CA   90028 
## 2434                    & Online
## 2435                        <NA>
## 2436                            
## 2437  Los Angeles,   CA   90025 
## 2438                        <NA>
## 2439   Not accepting new clients
## 2440                            
## 2441  Los Angeles,   CA   90008 
## 2442                    & Online
## 2443                        <NA>
## 2444                            
## 2445  Los Angeles,   CA   90034 
## 2446                    & Online
## 2447                        <NA>
## 2448                            
## 2449  Los Angeles,   CA   90025 
## 2450                    & Online
## 2451                        <NA>
## 2452                            
## 2453  Los Angeles,   CA   90048 
## 2454                    & Online
## 2455                        <NA>
## 2456                            
## 2457  Los Angeles,   CA   90028 
## 2458                    & Online
## 2459                        <NA>
## 2460                            
## 2461  Los Angeles,   CA   90019 
## 2462                    & Online
## 2463                        <NA>
## 2464                            
## 2465  Los Angeles,   CA   90047 
## 2466                    & Online
## 2467                        <NA>
## 2468                            
## 2469  Los Angeles,   CA   90028 
## 2470                    & Online
## 2471                        <NA>
## 2472                            
## 2473  Los Angeles,   CA   90024 
## 2474                    & Online
## 2475                        <NA>
## 2476                            
## 2477  Los Angeles,   CA   90025 
## 2478                    & Online
## 2479                        <NA>
## 2480                            
## 2481  Los Angeles,   CA   90048 
## 2482                    & Online
## 2483                        <NA>
## 2484                            
## 2485  Los Angeles,   CA   90036 
## 2486                    & Online
## 2487                        <NA>
## 2488                            
## 2489  Los Angeles,   CA   90006 
## 2490                        <NA>
## 2491   Not accepting new clients
## 2492                            
## 2493  Los Angeles,   CA   90066 
## 2494                    & Online
## 2495                        <NA>
## 2496                            
## 2497  Los Angeles,   CA   90026 
## 2498                        <NA>
## 2499   Not accepting new clients
## 2500                            
## 2501  Los Angeles,   CA   90071 
## 2502                    & Online
## 2503                        <NA>
## 2504                            
## 2505  Los Angeles,   CA   90010 
## 2506                    & Online
## 2507                        <NA>
## 2508                            
## 2509  Los Angeles,   CA   90039 
## 2510                    & Online
## 2511                        <NA>
## 2512                            
## 2513  Los Angeles,   CA   90038 
## 2514                    & Online
## 2515                        <NA>
## 2516                            
## 2517  Los Angeles,   CA   90045 
## 2518                    & Online
## 2519                        <NA>
## 2520                            
## 2521  Los Angeles,   CA   90067 
## 2522                    & Online
## 2523                        <NA>
## 2524                            
## 2525  Los Angeles,   CA   90047 
## 2526                    & Online
## 2527                        <NA>
## 2528                            
## 2529  Los Angeles,   CA   90043 
## 2530                    & Online
## 2531                        <NA>
## 2532                            
## 2533  Los Angeles,   CA   90068 
## 2534                    & Online
## 2535    Waitlist for new clients
## 2536                            
## 2537  Los Angeles,   CA   90013 
## 2538                    & Online
## 2539                        <NA>
## 2540                            
## 2541  Los Angeles,   CA   90064 
## 2542                    & Online
## 2543                        <NA>
## 2544                            
## 2545  Los Angeles,   CA   90045 
## 2546                        <NA>
## 2547   Not accepting new clients
## 2548                            
## 2549  Los Angeles,   CA   90035 
## 2550                    & Online
## 2551                        <NA>
## 2552                            
## 2553  Los Angeles,   CA   90039 
## 2554                    & Online
## 2555                        <NA>
## 2556                            
## 2557  Los Angeles,   CA   90066 
## 2558                    & Online
## 2559                        <NA>
## 2560                            
## 2561  Los Angeles,   CA   90038 
## 2562                    & Online
## 2563                        <NA>
## 2564                            
## 2565  Los Angeles,   CA   90026 
## 2566                        <NA>
## 2567   Not accepting new clients
## 2568                            
## 2569  Los Angeles,   CA   90010 
## 2570                    & Online
## 2571                        <NA>
## 2572                            
## 2573  Los Angeles,   CA   90035 
## 2574                    & Online
## 2575                        <NA>
## 2576                            
## 2577  Los Angeles,   CA   90001 
## 2578                        <NA>
## 2579                        <NA>
## 2580                            
## 2581  Los Angeles,   CA   90059 
## 2582                        <NA>
## 2583                        <NA>
## 2584                            
## 2585  Los Angeles,   CA   90046 
## 2586                    & Online
## 2587                        <NA>
## 2588                            
## 2589  Los Angeles,   CA   90034 
## 2590                    & Online
## 2591                        <NA>
## 2592                            
## 2593  Los Angeles,   CA   90025 
## 2594                    & Online
## 2595                        <NA>
## 2596                            
## 2597  Los Angeles,   CA   90041 
## 2598                    & Online
## 2599                        <NA>
## 2600                            
## 2601  Los Angeles,   CA   90017 
## 2602                    & Online
## 2603                        <NA>
## 2604                            
## 2605  Los Angeles,   CA   90019 
## 2606                    & Online
## 2607                        <NA>
## 2608                            
## 2609  Los Angeles,   CA   90026 
## 2610                    & Online
## 2611                        <NA>
## 2612                            
## 2613  Los Angeles,   CA   90025 
## 2614                    & Online
## 2615                        <NA>
## 2616                            
## 2617  Los Angeles,   CA   90026 
## 2618                    & Online
## 2619                        <NA>
## 2620                            
## 2621  Los Angeles,   CA   90026 
## 2622                        <NA>
## 2623                        <NA>
## 2624                            
## 2625  Los Angeles,   CA   90065 
## 2626                        <NA>
## 2627                        <NA>
## 2628                            
## 2629  Los Angeles,   CA   90044 
## 2630                        <NA>
## 2631   Not accepting new clients
## 2632                            
## 2633  Los Angeles,   CA   90049 
## 2634                        <NA>
## 2635   Not accepting new clients
## 2636                            
## 2637  Los Angeles,   CA   90024 
## 2638                    & Online
## 2639                        <NA>
## 2640                            
## 2641  Los Angeles,   CA   90049 
## 2642                        <NA>
## 2643   Not accepting new clients
## 2644                            
## 2645  Los Angeles,   CA   90024 
## 2646                    & Online
## 2647                        <NA>
## 2648                            
## 2649  Los Angeles,   CA   90026 
## 2650                    & Online
## 2651                        <NA>
## 2652                            
## 2653  Los Angeles,   CA   90026 
## 2654                        <NA>
## 2655                        <NA>
## 2656                            
## 2657  Los Angeles,   CA   90041 
## 2658                    & Online
## 2659                        <NA>
## 2660                            
## 2661  Los Angeles,   CA   90026 
## 2662                    & Online
## 2663                        <NA>
## 2664                            
## 2665  Los Angeles,   CA   90038 
## 2666                    & Online
## 2667                        <NA>
## 2668                            
## 2669  Los Angeles,   CA   90012 
## 2670                        <NA>
## 2671   Not accepting new clients
## 2672                            
## 2673  Los Angeles,   CA   90056 
## 2674                    & Online
## 2675                        <NA>
## 2676                            
## 2677  Los Angeles,   CA   90001 
## 2678                    & Online
## 2679                        <NA>
## 2680                            
## 2681  Los Angeles,   CA   90008 
## 2682                    & Online
## 2683                        <NA>
## 2684                            
## 2685  Los Angeles,   CA   90044 
## 2686                    & Online
## 2687    Waitlist for new clients
## 2688                            
## 2689  Los Angeles,   CA   90018 
## 2690                        <NA>
## 2691   Not accepting new clients
## 2692                            
## 2693  Los Angeles,   CA   90024 
## 2694                    & Online
## 2695                        <NA>
## 2696                            
## 2697  Los Angeles,   CA   90004 
## 2698                    & Online
## 2699                        <NA>
## 2700                            
## 2701  Los Angeles,   CA   90066 
## 2702                    & Online
## 2703                        <NA>
## 2704                            
## 2705  Los Angeles,   CA   90068 
## 2706                    & Online
## 2707                        <NA>
## 2708                            
## 2709  Los Angeles,   CA   90049 
## 2710                    & Online
## 2711                        <NA>
## 2712                            
## 2713  Los Angeles,   CA   90019 
## 2714                    & Online
## 2715                        <NA>
## 2716                            
## 2717  Los Angeles,   CA   90036 
## 2718                        <NA>
## 2719   Not accepting new clients
## 2720                            
## 2721  Los Angeles,   CA   90012 
## 2722                        <NA>
## 2723   Not accepting new clients
## 2724                            
## 2725  Los Angeles,   CA   90001 
## 2726                    & Online
## 2727                        <NA>
## 2728                            
## 2729  Los Angeles,   CA   90036 
## 2730                        <NA>
## 2731   Not accepting new clients
## 2732                            
## 2733  Los Angeles,   CA   90066 
## 2734                    & Online
## 2735                        <NA>
## 2736                            
## 2737  Los Angeles,   CA   90069 
## 2738                        <NA>
## 2739   Not accepting new clients
## 2740                            
## 2741  Los Angeles,   CA   90019 
## 2742                    & Online
## 2743                        <NA>
## 2744                            
## 2745  Los Angeles,   CA   90008 
## 2746                    & Online
## 2747                        <NA>
## 2748                            
## 2749  Los Angeles,   CA   90038 
## 2750                    & Online
## 2751                        <NA>
## 2752                            
## 2753  Los Angeles,   CA   90004 
## 2754                    & Online
## 2755                        <NA>
## 2756                            
## 2757  Los Angeles,   CA   90049 
## 2758                    & Online
## 2759                        <NA>
## 2760                            
## 2761  Los Angeles,   CA   90056 
## 2762                    & Online
## 2763                        <NA>
## 2764                            
## 2765  Los Angeles,   CA   90001 
## 2766                    & Online
## 2767                        <NA>
## 2768                            
## 2769  Los Angeles,   CA   90019 
## 2770                        <NA>
## 2771   Not accepting new clients
## 2772                            
## 2773  Los Angeles,   CA   90001 
## 2774                    & Online
## 2775                        <NA>
## 2776                            
## 2777  Los Angeles,   CA   90025 
## 2778                        <NA>
## 2779                        <NA>
## 2780                            
## 2781  Los Angeles,   CA   90064 
## 2782                    & Online
## 2783                        <NA>
## 2784                            
## 2785  Los Angeles,   CA   90034 
## 2786                    & Online
## 2787                        <NA>
## 2788                            
## 2789  Los Angeles,   CA   90034 
## 2790                    & Online
## 2791                        <NA>
## 2792                            
## 2793  Los Angeles,   CA   90065 
## 2794                    & Online
## 2795                        <NA>
## 2796                            
## 2797  Los Angeles,   CA   90066 
## 2798                    & Online
## 2799                        <NA>
## 2800                            
## 2801  Los Angeles,   CA   90036 
## 2802                        <NA>
## 2803                        <NA>
## 2804                            
## 2805  Los Angeles,   CA   90036 
## 2806                    & Online
## 2807                        <NA>
## 2808                            
## 2809  Los Angeles,   CA   90001 
## 2810                    & Online
## 2811                        <NA>
## 2812                            
## 2813  Los Angeles,   CA   90038 
## 2814                    & Online
## 2815                        <NA>
## 2816                            
## 2817  Los Angeles,   CA   90017 
## 2818                    & Online
## 2819                        <NA>
## 2820                            
## 2821  Los Angeles,   CA   90069 
## 2822                    & Online
## 2823                        <NA>
## 2824                            
## 2825  Los Angeles,   CA   90008 
## 2826                    & Online
## 2827                        <NA>
## 2828                            
## 2829  Los Angeles,   CA   90011 
## 2830                    & Online
## 2831                        <NA>
## 2832                            
## 2833  Los Angeles,   CA   90025 
## 2834                        <NA>
## 2835   Not accepting new clients
## 2836                            
## 2837  Los Angeles,   CA   90066 
## 2838                    & Online
## 2839                        <NA>
## 2840                            
## 2841  Los Angeles,   CA   90001 
## 2842                    & Online
## 2843                        <NA>
## 2844                            
## 2845  Los Angeles,   CA   90025 
## 2846                    & Online
## 2847                        <NA>
## 2848                            
## 2849  Los Angeles,   CA   90064 
## 2850                        <NA>
## 2851                        <NA>
## 2852                            
## 2853  Los Angeles,   CA   90065 
## 2854                    & Online
## 2855                        <NA>
## 2856                            
## 2857  Los Angeles,   CA   90089 
## 2858                    & Online
## 2859    Waitlist for new clients
## 2860                            
## 2861  Los Angeles,   CA   90044 
## 2862                    & Online
## 2863                        <NA>
## 2864                            
## 2865  Los Angeles,   CA   90048 
## 2866                    & Online
## 2867                        <NA>
## 2868                            
## 2869  Los Angeles,   CA   90044 
## 2870                    & Online
## 2871                        <NA>
## 2872                            
## 2873  Los Angeles,   CA   90065 
## 2874                    & Online
## 2875                        <NA>
## 2876                            
## 2877  Los Angeles,   CA   90094 
## 2878                    & Online
## 2879                        <NA>
## 2880                            
## 2881  Los Angeles,   CA   90027 
## 2882                    & Online
## 2883                        <NA>
## 2884                            
## 2885  Los Angeles,   CA   90027 
## 2886                    & Online
## 2887                        <NA>
## 2888                            
## 2889  Los Angeles,   CA   90036 
## 2890                    & Online
## 2891                        <NA>
## 2892                            
## 2893  Los Angeles,   CA   90089 
## 2894                    & Online
## 2895    Waitlist for new clients
## 2896                            
## 2897  Los Angeles,   CA   90050 
## 2898                    & Online
## 2899                        <NA>
## 2900                            
## 2901  Los Angeles,   CA   90049 
## 2902                    & Online
## 2903                        <NA>
## 2904                            
## 2905  Los Angeles,   CA   90021 
## 2906                    & Online
## 2907                        <NA>
## 2908                            
## 2909  Los Angeles,   CA   90046 
## 2910                    & Online
## 2911                        <NA>
## 2912                            
## 2913  Los Angeles,   CA   90016 
## 2914                    & Online
## 2915                        <NA>
## 2916                            
## 2917  Los Angeles,   CA   90036 
## 2918                        <NA>
## 2919                        <NA>
## 2920                            
## 2921  Los Angeles,   CA   90038 
## 2922                    & Online
## 2923                        <NA>
## 2924                            
## 2925  Los Angeles,   CA   90001 
## 2926                    & Online
## 2927                        <NA>
## 2928                            
## 2929  Los Angeles,   CA   90049 
## 2930                    & Online
## 2931                        <NA>
## 2932                            
## 2933  Los Angeles,   CA   90048 
## 2934                    & Online
## 2935                        <NA>
## 2936                            
## 2937  Los Angeles,   CA   90067 
## 2938                    & Online
## 2939                        <NA>
## 2940                            
## 2941  Los Angeles,   CA   90026 
## 2942                    & Online
## 2943                        <NA>
## 2944                            
## 2945  Los Angeles,   CA   90001 
## 2946                    & Online
## 2947                        <NA>
## 2948                            
## 2949  Los Angeles,   CA   90011 
## 2950                    & Online
## 2951                        <NA>
## 2952                            
## 2953  Los Angeles,   CA   90025 
## 2954                    & Online
## 2955                        <NA>
## 2956                            
## 2957  Los Angeles,   CA   90065 
## 2958                    & Online
## 2959                        <NA>
## 2960                            
## 2961  Los Angeles,   CA   90038 
## 2962                    & Online
## 2963                        <NA>
## 2964                            
## 2965  Los Angeles,   CA   90001 
## 2966                    & Online
## 2967                        <NA>
## 2968                            
## 2969  Los Angeles,   CA   90001 
## 2970                        <NA>
## 2971   Not accepting new clients
## 2972                            
## 2973  Los Angeles,   CA   90013 
## 2974                    & Online
## 2975                        <NA>
## 2976                            
## 2977  Los Angeles,   CA   90002 
## 2978                    & Online
## 2979                        <NA>
## 2980                            
## 2981  Los Angeles,   CA   90001 
## 2982                    & Online
## 2983                        <NA>
## 2984                            
## 2985  Los Angeles,   CA   90069 
## 2986                    & Online
## 2987    Waitlist for new clients
## 2988                            
## 2989  Los Angeles,   CA   90011 
## 2990                    & Online
## 2991                        <NA>
## 2992                            
## 2993  Los Angeles,   CA   90026 
## 2994                    & Online
## 2995                        <NA>
## 2996                            
## 2997  Los Angeles,   CA   90001 
## 2998                    & Online
## 2999                        <NA>
## 3000                            
## 3001  Los Angeles,   CA   90001 
## 3002                    & Online
## 3003                        <NA>
## 3004                            
## 3005  Los Angeles,   CA   90001 
## 3006                    & Online
## 3007                        <NA>
## 3008                            
## 3009  Los Angeles,   CA   90008 
## 3010                    & Online
## 3011                        <NA>
## 3012                            
## 3013  Los Angeles,   CA   90001 
## 3014                    & Online
## 3015    Waitlist for new clients
## 3016                            
## 3017  Los Angeles,   CA   90001 
## 3018                    & Online
## 3019                        <NA>
## 3020                            
## 3021  Los Angeles,   CA   90077 
## 3022                        <NA>
## 3023   Not accepting new clients
## 3024                            
## 3025  Los Angeles,   CA   90095 
## 3026                    & Online
## 3027                        <NA>
## 3028                            
## 3029  Los Angeles,   CA   90049 
## 3030                    & Online
## 3031                        <NA>
## 3032                            
## 3033  Los Angeles,   CA   90066 
## 3034                        <NA>
## 3035   Not accepting new clients
## 3036                            
## 3037  Los Angeles,   CA   90023 
## 3038                        <NA>
## 3039   Not accepting new clients
## 3040                            
## 3041  Los Angeles,   CA   90066 
## 3042                        <NA>
## 3043   Not accepting new clients
## 3044                            
## 3045  Los Angeles,   CA   90042 
## 3046                    & Online
## 3047                        <NA>
## 3048                            
## 3049  Los Angeles,   CA   90049 
## 3050                    & Online
## 3051                        <NA>
## 3052                            
## 3053  Los Angeles,   CA   90025 
## 3054                    & Online
## 3055                        <NA>
## 3056                            
## 3057  Los Angeles,   CA   90001 
## 3058                        <NA>
## 3059   Not accepting new clients
## 3060                            
## 3061  Los Angeles,   CA   90011 
## 3062                    & Online
## 3063                        <NA>
## 3064                            
## 3065  Los Angeles,   CA   90001 
## 3066                    & Online
## 3067                        <NA>
## 3068                            
## 3069  Los Angeles,   CA   90007 
## 3070                    & Online
## 3071                        <NA>
## 3072                            
## 3073  Los Angeles,   CA   90023 
## 3074                        <NA>
## 3075   Not accepting new clients
## 3076                            
## 3077  Los Angeles,   CA   90002 
## 3078                    & Online
## 3079                        <NA>
## 3080                            
## 3081  Los Angeles,   CA   90001 
## 3082                    & Online
## 3083                        <NA>
## 3084                            
## 3085  Los Angeles,   CA   90048 
## 3086                    & Online
## 3087                        <NA>
## 3088                            
## 3089  Los Angeles,   CA   90007 
## 3090                    & Online
## 3091                        <NA>
## 3092                            
## 3093  Los Angeles,   CA   90002 
## 3094                    & Online
## 3095                        <NA>
## 3096                            
## 3097  Los Angeles,   CA   90056 
## 3098                    & Online
## 3099                        <NA>
## 3100                            
## 3101  Los Angeles,   CA   90026 
## 3102                        <NA>
## 3103   Not accepting new clients
## 3104                            
## 3105  Los Angeles,   CA   90095 
## 3106                    & Online
## 3107                        <NA>
## 3108                            
## 3109  Los Angeles,   CA   90066 
## 3110                    & Online
## 3111    Waitlist for new clients
## 3112                            
## 3113  Los Angeles,   CA   90002 
## 3114                    & Online
## 3115                        <NA>
## 3116                            
## 3117  Los Angeles,   CA   90001 
## 3118                    & Online
## 3119                        <NA>
## 3120                            
## 3121  Los Angeles,   CA   90056 
## 3122                    & Online
## 3123                        <NA>
## 3124                            
## 3125  Los Angeles,   CA   90001 
## 3126                    & Online
## 3127                        <NA>
## 3128                            
## 3129  Los Angeles,   CA   90001 
## 3130                    & Online
## 3131                        <NA>
## 3132                            
## 3133  Los Angeles,   CA   90077 
## 3134                    & Online
## 3135                        <NA>
## 3136                            
## 3137  Los Angeles,   CA   90015 
## 3138                    & Online
## 3139                        <NA>
## 3140                            
## 3141  Los Angeles,   CA   90056 
## 3142                    & Online
## 3143    Waitlist for new clients
## 3144                            
## 3145  Los Angeles,   CA   90001 
## 3146                    & Online
## 3147                        <NA>
## 3148                            
## 3149  Los Angeles,   CA   90016 
## 3150                    & Online
## 3151                        <NA>
## 3152                            
## 3153  Los Angeles,   CA   90007 
## 3154                    & Online
## 3155                        <NA>
## 3156                            
## 3157  Los Angeles,   CA   90004 
## 3158                    & Online
## 3159                        <NA>
## 3160                            
## 3161  Los Angeles,   CA   90017 
## 3162                    & Online
## 3163                        <NA>
## 3164                            
## 3165  Los Angeles,   CA   90035 
## 3166                    & Online
## 3167                        <NA>
## 3168                            
## 3169  Los Angeles,   CA   90064 
## 3170                    & Online
## 3171                        <NA>
## 3172                            
## 3173  Los Angeles,   CA   90016 
## 3174                    & Online
## 3175                        <NA>
## 3176                            
## 3177  Los Angeles,   CA   90047 
## 3178                    & Online
## 3179                        <NA>
## 3180                            
## 3181  Los Angeles,   CA   90066 
## 3182                    & Online
## 3183                        <NA>
## 3184                            
## 3185  Los Angeles,   CA   90034 
## 3186                    & Online
## 3187                        <NA>
## 3188                            
## 3189  Los Angeles,   CA   90066 
## 3190                    & Online
## 3191                        <NA>
## 3192                            
## 3193  Los Angeles,   CA   90007 
## 3194                    & Online
## 3195                        <NA>
## 3196                            
## 3197  Los Angeles,   CA   90004 
## 3198                    & Online
## 3199                        <NA>
## 3200
df2_partc = c()

start_index = 1
end_index = start_index + 2

while(start_index <= nrow(df1_partc)-4) {
  entry <- df1_partc[start_index:end_index,]
  
  #Create new column titles to correspond with columns X2 and X3
  X4 <- c("title", "statement", "phone")
  X5 <- c("city_state_zip", "online", "new_patients")
  
  #Combine these new columns to the df
  entry <- cbind(entry, X4)
  entry <- cbind(entry, X5)
  
  entry_tib <- as_tibble(entry)
  
  entry_tib <- entry_tib %>% 
    spread(X4,X2) %>%
    spread(X5, X3)
  
  entry_tib <- entry_tib %>% 
    mutate(X1 = ifelse(X1 == "", NA, X1))
  
  entry_tib <- entry_tib %>%
    fill(colnames(entry_tib), .direction="downup")
  
  df2_partc <- rbind(df2_partc, entry_tib[1,])
  
  start_index = end_index+2
  end_index = start_index + 2
  #print(entry)
  
  
}



#Rename column X1 to name
df2_partc <- df2_partc %>% 
  rename(name = X1)

#Strip white space and newline characters from name, statement and title fields

df3_partc <- df2_partc %>% 
  mutate(name = str_squish(name), 
         title = str_squish(title))

#Remove new line and double spacing from the statement field
df3_partc <- df3_partc %>% 
  mutate(statement = str_replace_all(statement, "\\n", "")) %>% 
  mutate(statement = str_replace_all(statement, "\\s{2,}", " "))

#Remove starting and trailing white space from city_state_zip
df4_partc <- df3_partc %>% 
  mutate(city_state_zip = str_squish(city_state_zip))

#Separate the city_state_zip field
df5_partc <- df4_partc %>% 
  separate(city_state_zip, into=c("city", "state_zip"), sep=",") %>% 
  mutate(state_zip = str_squish(state_zip)) %>% 
  separate(state_zip, into=c("state", "zip"))

#Convert the new_patient and online values to single character codes
df6_partc <- df5_partc %>% 
  mutate(new_patients = case_when(new_patients == "Not accepting new clients" ~ "N", new_patients == "Waitlist for new clients" ~ "W", TRUE ~ "Y")) %>% 
  mutate(online = case_when(online == "& Online" ~ "Y", TRUE ~ "N"))



#Simplify the title
df7_partc <- df6_partc %>% 
 mutate(title = str_match(title, pattern=".+?(?=,)")[1])



df7_partc
## # A tibble: 799 × 9
##    name                 phone     state…¹ title city  state zip   new_p…² online
##    <chr>                <chr>     <chr>   <chr> <chr> <chr> <chr> <chr>   <chr> 
##  1 Uriah Cty            (213) 51… "Maybe… Marr… Los … CA    90048 Y       Y     
##  2 James Birks          <NA>      "Accep… Marr… Los … CA    90044 Y       Y     
##  3 Taronda Jones        (323) 34… "Are y… Marr… Los … CA    90008 Y       Y     
##  4 Christina Harrison   (213) 32… "My pr… Marr… Los … CA    90066 N       N     
##  5 Eric Michael Katende (213) 21… "Reach… Marr… Los … CA    90004 Y       Y     
##  6 Brittany Williams    <NA>      "I am … Marr… Los … CA    90019 Y       Y     
##  7 Claudia Williams     (424) 35… "“We g… Marr… Los … CA    90025 Y       Y     
##  8 Bradlisia Dixon      (424) 41… "Are y… Marr… Los … CA    90045 Y       Y     
##  9 Dr. Daryl M Rowe     (323) 20… "As a … Marr… Los … CA    90064 N       N     
## 10 Camille Tenerife     (424) 39… "As a … Marr… Los … CA    90004 Y       Y     
## # … with 789 more rows, and abbreviated variable names ¹​statement,
## #   ²​new_patients
#Output Tidy data
#write_csv(df7_partc, "../output/aatherapist_tidy.csv")

Analysis

For this dataset we will answer the following:

  1. Quantify the split between Male and Female therapist
  2. Looking at the different types of certifications represented by the population
  3. Identifying the % of therapist offering online, on-site and/or both types of services
  4. Identifying the percent accepting new patients
  5. Break down the group based on their zip code

Answers (1) The dataset did not have the gender of the therapist, so I was unable to complete this analysis at this time (2) Overall there were 25 distinct title (24 when excluding NA). The top 10 titles represented 96% of the therapists in the group (3) Overall 87.3% of therapist are offering online therapy services (4) Overall 85.36% of therapist were accepting new patients, 9.76% were not accepting new patients, and 4.88% (5) Overall there were 76 unique zip codes represented in the dataset. The top 10 zip codes represented 45.9% of the therapists in the group

df3 <- df7_partc 

df3
## # A tibble: 799 × 9
##    name                 phone     state…¹ title city  state zip   new_p…² online
##    <chr>                <chr>     <chr>   <chr> <chr> <chr> <chr> <chr>   <chr> 
##  1 Uriah Cty            (213) 51… "Maybe… Marr… Los … CA    90048 Y       Y     
##  2 James Birks          <NA>      "Accep… Marr… Los … CA    90044 Y       Y     
##  3 Taronda Jones        (323) 34… "Are y… Marr… Los … CA    90008 Y       Y     
##  4 Christina Harrison   (213) 32… "My pr… Marr… Los … CA    90066 N       N     
##  5 Eric Michael Katende (213) 21… "Reach… Marr… Los … CA    90004 Y       Y     
##  6 Brittany Williams    <NA>      "I am … Marr… Los … CA    90019 Y       Y     
##  7 Claudia Williams     (424) 35… "“We g… Marr… Los … CA    90025 Y       Y     
##  8 Bradlisia Dixon      (424) 41… "Are y… Marr… Los … CA    90045 Y       Y     
##  9 Dr. Daryl M Rowe     (323) 20… "As a … Marr… Los … CA    90064 N       N     
## 10 Camille Tenerife     (424) 39… "As a … Marr… Los … CA    90004 Y       Y     
## # … with 789 more rows, and abbreviated variable names ¹​statement,
## #   ²​new_patients
#(1) Quantify the split between Male and Female therapist


#(2) Looking at the different types of certifications represented by the population
(sum(df3 %>%
  filter(!is.na(title)) %>%
  group_by(title) %>%
  summarize(n = n()) %>%
  mutate(pct_total = n/sum(n)) %>%
  arrange(desc(n)) %>%
  head(10) %>% 
  select(pct_total)))
## [1] 1
df3 %>%
  filter(!is.na(title)) %>%
  group_by(title) %>%
  summarize(n = n()) %>%
  mutate(pct_total = n/sum(n)) %>%
  arrange(desc(n)) %>%
  head(10) %>% 
  select(title, pct_total) %>%
  mutate(pct_total = paste0(format(pct_total*100,digits=1),"%")) %>%
  rename(Title = title, `Percent Total` = pct_total) %>%
  knitr::kable()
Title Percent Total
Marriage & Family Therapist 100%
df3 %>%
  filter(!is.na(title)) %>%
  group_by(title) %>%
  summarize(n = n()) %>%
  mutate(pct_total = n/sum(n)) %>%
  arrange(desc(n)) %>%
  head(10) %>%
  mutate(title = factor(title, levels=title)) %>%
  ggplot(aes(x=title, y=pct_total)) +
  geom_bar(stat='identity', aes(fill=title)) +
  theme(axis.text.x = element_text(angle=90)) +
  labs(title = "\n Top 10 Certification Types", 
       x = "\n Title", 
       y = "\n Percent of Therapist", 
       fill = "Certification") + 
  scale_y_continuous(labels = scales::percent)

#(3) Identifying the % of therapist offering online services
(prop.table(table(df3$online)))
## 
##         N         Y 
## 0.1276596 0.8723404
df3 %>%
  group_by(online) %>%
  summarize(n = n()) %>%
  mutate(pct_total = n/sum(n)) %>%
  ggplot(aes(x=online, y=pct_total)) +
  geom_bar(aes(fill = online), stat='identity') +
  labs(title = "\n Percent Offering Online Service", 
       y = "\n Percent of Total") +
  scale_y_continuous(labels = scales::percent)

#(4) Identifying the percent accepting new patients
(prop.table(table(df3$new_patients)))
## 
##          N          W          Y 
## 0.09762203 0.04881101 0.85356696
#(5) Break down the group based on their zip code
(sum(df3 %>% 
  group_by(zip) %>%
  summarize(n = n()) %>%
  mutate(pct_total = n/sum(n)) %>%
  arrange(desc(n)) %>%
  head(10) %>%
  select(pct_total)))
## [1] 0.4593242
df3 %>% 
  group_by(zip) %>%
  summarize(n = n()) %>%
  mutate(pct_total = n/sum(n)) %>%
  arrange(desc(n)) %>%
  head(10) %>%
  mutate(zip = factor(zip, levels=zip)) %>%
  ggplot(aes(x=zip, y=pct_total)) +
  geom_bar(aes(fill=zip), stat='identity') +
  scale_y_continuous(labels = scales::percent) + 
  labs(title = "\n Top 10 Zip Codes", 
       x= element_blank(), 
       y= "Percent of Total") +
  theme(axis.text.x =  element_text(angle=90))

unique(df3$title)
## [1] "Marriage & Family Therapist"

Conclusion